1! { dg-do compile }
2! { dg-options "-pedantic -std=f95" }
3
4! Check that DIMENSION/POINTER/ALLOCATABLE/INTENT statements *do* allow
5! symbols to be typed later.
6
7SUBROUTINE test (a)
8  IMPLICIT REAL (a-z)
9
10  ! Those should *not* IMPLICIT-type the symbols:
11  INTENT(IN) :: a
12  DIMENSION :: b(:)
13  POINTER :: c
14  ALLOCATABLE :: b
15
16  ! So this is ok:
17  INTEGER :: a, b, c
18
19END SUBROUTINE test
20