Plugins: Add label-text.h to CPPLIB_H so it will be installed [PR115288]
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr89943_4.f90
blobcb955d01c88a44e2c42f2e1d3673b7d6b5a65d40
1 ! { dg-do compile }
2 module Foo_mod
4 implicit none
6 interface
7 module function runFoo4C(ndim) bind(C, name="runFoo")
8 use, intrinsic :: iso_c_binding
9 implicit none
10 integer runFoo4c
11 integer(c_int32_t) , intent(in) :: ndim
12 end function runFoo4C
13 end interface
15 contains
17 end module Foo_mod
19 submodule(Foo_mod) Foo_smod
21 contains
23 module function runFoo4C(ndim) bind(C, name="runFu") ! { dg-error "Mismatch in BIND" }
24 use, intrinsic :: iso_c_binding ! { dg-error "Unexpected USE statement in" }
25 implicit none ! { dg-error "Unexpected IMPLICIT NONE statement" }
26 integer(c_int32_t) , intent(in) :: ndim ! { dg-error "Symbol 'c_int32_t' at .1. has no IMPLICIT type" }
27 end function runFoo4C ! { dg-error "Expecting END SUBMODULE" }
29 end submodule Foo_smod