Retro68/gcc/gcc/testsuite/gfortran.dg/c_loc_pure_1.f90
Wolfgang Thaller aaf905ce07 add gcc 4.70
2012-03-28 01:13:14 +02:00

12 lines
285 B
Fortran

! { dg-do compile }
! { dg-options "-Wimplicit-interface" }
! PR 38220 - c_loc is pure and has an explicit interface
USE ISO_C_BINDING, ONLY: C_PTR, C_LOC
CONTAINS
PURE SUBROUTINE F(x)
INTEGER, INTENT(in), TARGET :: x
TYPE(C_PTR) :: px
px = C_LOC(x)
END SUBROUTINE
END