URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [pr49698.f90] - Rev 694
Compare with Previous | Blame | View Log
! PR fortran/49698
! { dg-do compile }
subroutine foo (x, y, z)
type S
integer, pointer :: e => null()
end type S
type T
type(S), dimension(:), allocatable :: a
end type T
type(T) :: x, y
integer :: z, i
forall (i = 1 : z)
y%a(i)%e => x%a(i)%e
end forall
end subroutine foo