blob: 8eaa5a5e4b533c5f4b8f2d5f2340d7cf8ce241dc [file] [log] [blame]
! { dg-do compile }
! { dg-options "-fwhole-program" }
!
! PR fortran/45087
!
module ints
INTERFACE
SUBROUTINE NOZZLE()
END SUBROUTINE NOZZLE
END INTERFACE
end module ints
SUBROUTINE NOZZLE()
END SUBROUTINE NOZZLE
program CORTESA
USE INTS
CALL NOZZLE ()
END program CORTESA