1! { dg-do compile }
2!
3! PR fortran/34763
4! Before, gfortran did not allow for the "END" in
5! the interface, which is no module procedure.
6!
7! Test case contributed by Dick Hendrickson
8!
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
19