rt_gccstream/gcc/testsuite/gfortran.dg/c_loc_tests_4.f03

16 lines
435 B
Fortran

! { dg-do compile }
module c_loc_tests_4
use, intrinsic :: iso_c_binding
implicit none
contains
subroutine sub0() bind(c)
integer(c_int), target, dimension(10) :: my_array
integer(c_int), pointer, dimension(:) :: my_array_ptr
type(c_ptr) :: my_c_ptr
my_array_ptr => my_array
my_c_ptr = c_loc(my_array_ptr) ! { dg-error "must be an associated scalar POINTER" }
end subroutine sub0
end module c_loc_tests_4