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
11 subroutine n_interface
13 SUBROUTINE NGSXDY(TLS1
,TLS2
)
17 end ! { dg-error "END SUBROUTINE statement" }
18 end module ! { dg-error "END SUBROUTINE statement" }
19 ! { dg-error "Unexpected end of file" "" { target "*-*-*" } 0 }