* tree-loop-distribution.c (struct partition): New field recording
[official-gcc.git] / gcc / testsuite / gfortran.dg / whole_file_19.f90
blobcd69f92d427a8660031604f04dff4914f144b83f
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.
6 ! Contributed by Joost VandeVandole <jv244@cam.ac.uk>
8 SUBROUTINE c()
9 CALL a()
10 END SUBROUTINE c
12 SUBROUTINE a()
13 END SUBROUTINE a
15 MODULE M
16 CONTAINS
17 SUBROUTINE b()
18 CALL c()
19 END SUBROUTINE
20 END MODULE
22 USE M
23 CALL b()
24 END