7 module subroutine runFoo4C(ndim
) bind(C
, name
="runFoo")
8 use, intrinsic :: iso_c_binding
10 integer(c_int32_t
) , intent(in
) :: ndim
11 end subroutine runFoo4C
18 submodule(Foo_mod
) Foo_smod
22 module subroutine runFoo4C(ndim
) bind(C
, name
="runFu") ! { dg-error "Mismatch in BIND" }
23 use, intrinsic :: iso_c_binding
! { dg-error "Unexpected USE statement" }
24 implicit none ! { dg-error "Unexpected IMPLICIT NONE statement" }
25 integer(c_int32_t
) , intent(in
) :: ndim
! { dg-error "Unexpected data declaration" }
26 end subroutine runFoo4C
! { dg-error " Expecting END SUBMODULE" }
28 end submodule Foo_smod