1! { dg-do compile }
2subroutine aaa(in)
3  use iso_c_binding
4  implicit none
5  CHARACTER(KIND=C_CHAR), DIMENSION(*), TARGET  :: in
6  type(c_ptr) :: cptr
7  cptr = c_loc(in)
8end subroutine aaa
9
10
11