* tree-loop-distribution.c (struct partition): New field recording
[official-gcc.git] / gcc / testsuite / gfortran.dg / implicit_13.f90
blob9007259770fc2bd73c4aeec5159981e7065e255b
1 ! { dg-do compile }
3 ! PR fortran/35770
4 ! Implicit declaration hides type of internal function.
6 ! Contributed by Dick Hendrickson <dick.hendrickson@gmail.com>
8 IMPLICIT CHARACTER (s)
9 REAL :: RDA
11 RDA = S_REAL_SQRT_I(42) ! { dg-bogus "Can't convert" }
13 CONTAINS
15 REAL FUNCTION S_REAL_SQRT_I(I) RESULT (R)
16 IMPLICIT NONE
17 INTEGER :: I
18 R = 0.0
19 END FUNCTION S_REAL_SQRT_I
21 END