OSDN Git Service
(root)
/
pf3gnuchains
/
gcc-fork.git
/ blob
commit
grep
author
committer
pickaxe
?
search:
re
summary
|
shortlog
|
log
|
commit
|
commitdiff
|
tree
history
|
raw
|
HEAD
2010-07-29 Tobias Burnus <burnus@net-b.de>
[pf3gnuchains/gcc-fork.git]
/
gcc
/
testsuite
/
gfortran.dg
/
whole_file_25.f90
1
! { dg-do compile }
2
! { dg-options "-fwhole-program" }
3
!
4
! PR fortran/45087
5
!
6
7
module ints
8
INTERFACE
9
SUBROUTINE NOZZLE()
10
END SUBROUTINE NOZZLE
11
END INTERFACE
12
end module ints
13
14
SUBROUTINE NOZZLE()
15
END SUBROUTINE NOZZLE
16
program CORTESA
17
USE INTS
18
CALL NOZZLE ()
19
END program CORTESA
20
21
! { dg-final { cleanup-modules "ints" } }