nvptx, libgfortran: Switch out of "minimal" mode
[official-gcc.git] / gcc / testsuite / gfortran.dg / host_assoc_function_4.f90
blob7178cc980cbaa189039bad54b62cedb12f8aedbb
1 ! { dg-do run }
3 ! PR fortran/37445, in which the contained 's1' would be
4 ! ignored and the use+host associated version used.
6 ! Contributed by Norman S Clerman < clerman@fuse.net>
8 MODULE M1
9 CONTAINS
10 integer function S1 ()
11 s1 = 0
12 END function
13 END MODULE
15 MODULE M2
16 USE M1
17 CONTAINS
18 SUBROUTINE S2
19 if (s1 () .ne. 1) STOP 1
20 CONTAINS
21 integer function S1 ()
22 s1 = 1
23 END function
24 END SUBROUTINE
25 END MODULE
27 USE M2
28 CALL S2
29 END