OSDN Git Service

2012-01-30 Richard Guenther <rguenther@suse.de>
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / der_pointer_2.f90
1 ! { dg-do compile }
2 ! PR 15975, PR 16606
3 ! Pointers to derived types with initialized components
4 !
5 ! Contributed by Erik Edelmann <erik.edelmann@iki.fi>
6 !
7 SUBROUTINE N
8   TYPE T
9     INTEGER :: I = 99
10   END TYPE T
11   TYPE(T), POINTER :: P
12   TYPE(T), TARGET  :: Q
13   P => Q
14   if (P%I.ne.99) call abort ()
15 END SUBROUTINE N
16
17 program test_pr15975
18   call n ()
19 end program test_pr15975
20