modula2: Simplify REAL/LONGREAL/SHORTREAL node creation.
[official-gcc.git] / gcc / testsuite / gfortran.dg / interface_proc_end.f90
blob2fc9921df413d0c55fa0c05c843ba71d82fa7f1b
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 subroutine
18 end module