nvptx, libgfortran: Switch out of "minimal" mode
[official-gcc.git] / gcc / testsuite / gfortran.dg / used_before_typed_5.f90
blob9e78e681f48346da374c2706670d3640a6b91f7b
1 ! { dg-do compile }
2 ! { dg-options "-pedantic -std=f95" }
4 ! Check that DIMENSION/POINTER/ALLOCATABLE/INTENT statements *do* allow
5 ! symbols to be typed later.
7 SUBROUTINE test (a)
8 IMPLICIT REAL (a-z)
10 ! Those should *not* IMPLICIT-type the symbols:
11 INTENT(IN) :: a
12 DIMENSION :: b(:)
13 POINTER :: c
14 ALLOCATABLE :: b
16 ! So this is ok:
17 INTEGER :: a, b, c
19 END SUBROUTINE test