2008-07-06 Kai Tietz <kai.tietz@onevision.com>
[official-gcc.git] / gcc / testsuite / gfortran.dg / interface_proc_end.f90
blobc6ea2b9e032c70d994918d24ad3729647211e70f
1 ! { dg-do compile}
3 ! PR fortran/34763
4 ! Before, gfortran did not allow for the "END" in
5 ! the interface, which is no module procedure.
7 ! Test case contributed by Dick Hendrickson
9 module n
10 contains
11 subroutine n_interface
12 INTERFACE
13 SUBROUTINE NGSXDY(TLS1,TLS2)
14 REAL :: TLS1,TLS2
15 END ! OK
16 END INTERFACE
17 end ! { dg-error "END SUBROUTINE statement" }
18 end module ! { dg-error "END SUBROUTINE statement" }
19 ! { dg-error "Unexpected end of file" "" { target "*-*-*" } 0 }