PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr81889.f90
blob0516922ceb962bd1b7bebce23fbbd3c221276014
1 ! { dg-do compile }
2 ! { dg-options "-O3 -Wall" }
4 module m
6 type t
7 integer, dimension(:), pointer :: list
8 end type
10 contains
12 subroutine s(n, p, Y)
13 integer, intent(in) :: n
14 type(t) :: p
15 real, dimension(:) :: Y
17 real, dimension(1:16) :: xx
19 if (n > 3) then
20 xx(1:n) = 0.
21 print *, xx(1:n)
22 else
23 xx(1:n) = Y(p%list(1:n)) ! { dg-bogus "uninitialized" }
24 print *, sum(xx(1:n))
25 end if
27 end subroutine
29 end module