PR tree-optimization/86415 - strlen() not folded for substrings within constant arrays
[official-gcc.git] / gcc / testsuite / gfortran.dg / der_pointer_2.f90
blobbaf0aa564e57ef0a08e0773ace06197278575990
1 ! { dg-do compile }
2 ! PR 15975, PR 16606
3 ! Pointers to derived types with initialized components
5 ! Contributed by Erik Edelmann <erik.edelmann@iki.fi>
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) STOP 1
15 END SUBROUTINE N
17 program test_pr15975
18 call n ()
19 end program test_pr15975