(root)/
gcc-13.2.0/
gcc/
testsuite/
gfortran.dg/
c-interop/
fc-descriptor-8.f90
! { dg-do run }
! { dg-additional-sources "fc-descriptor-8-c.c dump-descriptors.c" }
!
! Check that C descriptors have the version field set correctly.
! This program is just a stub to create a descriptor and pass it to the
! C function, which does the actual test.

program testit
  use iso_c_binding
  implicit none

  interface
    subroutine ctest (a) bind (c)
      use iso_c_binding
      integer(C_INT) :: a(:,:)
    end subroutine
  end interface

  integer(C_INT) :: aa(10,-1:3)
  call ctest (aa)

end program