URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [extends_14.f03] - Rev 801
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do compile }
! { dg-options "-fdump-tree-original" }
!
! PR 49466: [4.6/4.7 Regression] Memory leak with assignment of extended derived types
!
! Contributed by Rich Townsend <townsend@astro.wisc.edu>
program evolve_aflow
implicit none
type :: state_t
real, allocatable :: U(:)
end type
type, extends(state_t) :: astate_t
end type
type(astate_t) :: a,b
allocate(a%U(1000))
a = b
end program
! { dg-final { scan-tree-dump-times "__builtin_free" 3 "original" } }
! { dg-final { cleanup-tree-dump "original" } }
Go to most recent revision | Compare with Previous | Blame | View Log