2 ! { dg-options "-std=f95 -Wno-intrinsics-std" }
5 ! Check that calls to intrinsics not in the current standard are "allowed" and
6 ! linked to external procedures with that name.
7 ! Addionally, this checks that -Wno-intrinsics-std turns off the warning.
14 REAL FUNCTION asinh (arg
)
22 SUBROUTINE implicit_none
24 REAL :: asinh
! { dg-bogus "Fortran 2008" }
27 ! Both times our version above should be called
28 CALL abort () ! { dg-bogus "extension" }
29 x
= ASINH (1.) ! { dg-bogus "Fortran 2008" }
30 END SUBROUTINE implicit_none
32 SUBROUTINE implicit_type
33 ! ASINH has implicit type here
36 ! Our version should be called
37 x
= ASINH (1.) ! { dg-bogus "Fortran 2008" }
38 END SUBROUTINE implicit_type
41 ! This should give a total of three "Correct"s
46 ! { dg-output "Correct\.*Correct\.*Correct" }