blob: 638cbb0b78525f35390113551b21dd5ba682fa56 [file] [log] [blame]
! 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