summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/whole_file_25.f90
blob: d2cbd36ae1d6366630b686d6e621655179001fd7 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
! { 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

! { dg-final { cleanup-modules "ints" } }