Merge from trunk @ 138209
[official-gcc.git] / gcc / testsuite / gfortran.dg / intrinsic_shadow_3.f03
blob069a99b343350223a9af35b364255e07aa8f9bd1
1 ! { dg-do compile }
2 ! { dg-options "-Wno-intrinsic-shadow -fall-intrinsics" }
4 ! PR fortran/33141
5 ! Check that the "intrinsic shadow" warnings are not emitted if the warning
6 ! is negated.
8 MODULE testmod
9   IMPLICIT NONE
11 CONTAINS
13   REAL FUNCTION asin (arg) ! { dg-bogus "shadow the intrinsic" }
14     IMPLICIT NONE
15     REAL :: arg
16   END FUNCTION asin
18 END MODULE testmod
20 REAL FUNCTION acos (arg) ! { dg-bogus "of an intrinsic" }
21   IMPLICIT NONE
22   REAL :: arg
23 END FUNCTION acos
25 ! We do only compile, so no main program needed.
27 ! { dg-final { cleanup-modules "testmod" } }