diff options
Diffstat (limited to 'gcc/testsuite/gfortran.dg/bind_c_usage_21.f90')
-rw-r--r-- | gcc/testsuite/gfortran.dg/bind_c_usage_21.f90 | 25 |
1 files changed, 25 insertions, 0 deletions
diff --git a/gcc/testsuite/gfortran.dg/bind_c_usage_21.f90 b/gcc/testsuite/gfortran.dg/bind_c_usage_21.f90 new file mode 100644 index 000000000..10a86dbbb --- /dev/null +++ b/gcc/testsuite/gfortran.dg/bind_c_usage_21.f90 @@ -0,0 +1,25 @@ +! { dg-do compile } +! +! PR fortran/45211 +! +! Contributed by Scot Breitenfeld +! +module m +contains + FUNCTION liter_cb(link_info) bind(C) + USE ISO_C_BINDING + IMPLICIT NONE + + INTEGER(c_int) liter_cb + + TYPE, bind(C) :: info_t + INTEGER(c_int) :: type + END TYPE info_t + + TYPE(info_t) :: link_info + + liter_cb = 0 + END FUNCTION liter_cb +end module m + +! { dg-final { cleanup-modules "m" } } |