1! { dg-do compile }
2!
3! PR fortran/38829
4!
5MODULE mExample
6CONTAINS
7      SUBROUTINE wrapper(y_c) bind(c)
8      USE iso_c_binding
9      type, bind(c) :: ty_c
10        type(c_ptr) :: y_cptr
11        Integer(c_int) ny
12      end type
13      type(ty_c) :: y_c
14      END SUBROUTINE
15END MODULE
16