URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [realloc_on_assign_9.f90] - Rev 694
Compare with Previous | Blame | View Log
! { dg-do run }
!
! PR fortran/51869
!
module soop_stars_class
implicit none
type soop_stars
real ,dimension(:,:) ,allocatable :: position
end type
type show
type(soop_stars) :: rocket
end type
contains
function new_show(boom)
type(soop_stars) ,intent(in) :: boom
type(show) :: new_show
new_show%rocket = boom
end function
end module
program main
use soop_stars_class
implicit none
type(soop_stars) :: fireworks
type(show), allocatable :: july4
allocate (fireworks%position(2,2))
fireworks%position = 33.0
july4 = new_show(boom=fireworks)
end program
! { dg-final { cleanup-modules "soop_stars_class" } }