Merge from mainline (167278:168000).
[official-gcc/graphite-test-results.git] / gcc / testsuite / gfortran.dg / host_assoc_call_6.f90
blob60a5edc53c1d29be0ced97e0923ae3fdfb686472
1 ! { dg-do compile }
3 ! PR fortran/38594, in which the symtree for the first
4 ! 'g' was being attached to the second. This is necessary
5 ! for generic interfaces(eg. hosts_call_3.f90) but makes
6 ! a mess otherwise.
8 ! Contributed by Daniel Franke <dfranke@gcc.gnu.org>
10 MODULE m
11 CONTAINS
12 SUBROUTINE g()
13 END SUBROUTINE
14 SUBROUTINE f()
15 CALL g()
16 CONTAINS
17 SUBROUTINE g()
18 END SUBROUTINE
19 END SUBROUTINE
20 END MODULE
22 USE m
23 CALL g()
24 END
25 ! { dg-final { cleanup-modules "m" } }