OSDN Git Service

2010-11-02 Steven G. Kargl < kargl@gcc.gnu.org>
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / whole_file_19.f90
1 ! { dg-do compile }
2 ! { dg-options "-fwhole-file" }
3 ! Test the fix for pr40011 comment #42, in which the subroutine
4 ! would just get lost with -fwhole-file.
5 !
6 ! Contributed by Joost VandeVandole <jv244@cam.ac.uk>
7 !
8 SUBROUTINE c()
9  CALL a()
10 END SUBROUTINE c
11
12 SUBROUTINE a()
13 END SUBROUTINE a
14
15 MODULE M
16 CONTAINS
17  SUBROUTINE b()
18    CALL c()
19  END SUBROUTINE
20 END MODULE
21
22 USE M
23 CALL b()
24 END
25 ! { dg-final { cleanup-modules "m" } }