view gcc/testsuite/gfortran.dg/whole_file_25.f90 @ 145:1830386684a0

gcc-9.2.0
author anatofuz
date Thu, 13 Feb 2020 11:34:05 +0900
parents 04ced10e8804
children
line wrap: on
line source

! { 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