1! { dg-do compile }
2! { dg-options "-fcheck=bounds" }
3!
4! PR fortran/43015
5!
6! Contributed by Dennis Wassel
7!
8SUBROUTINE foo(msg) BIND(C, name = "Foo")
9  USE, INTRINSIC :: iso_c_binding
10  IMPLICIT NONE
11  CHARACTER (KIND=C_CHAR), INTENT (out) :: msg(*)
12END SUBROUTINE foo
13
14