]> gcc.gnu.org Git - gcc.git/blob - gcc/testsuite/gfortran.dg/c_assoc_2.f03
[multiple changes]
[gcc.git] / gcc / testsuite / gfortran.dg / c_assoc_2.f03
1 ! { dg-do compile }
2 module c_assoc_2
3 use, intrinsic :: iso_c_binding, only: c_ptr, c_associated
4
5 contains
6 subroutine sub0(my_c_ptr) bind(c)
7 type(c_ptr), value :: my_c_ptr
8 type(c_ptr), pointer :: my_c_ptr_2
9 integer :: my_integer
10
11 if(.not. c_associated(my_c_ptr)) then
12 call abort()
13 end if
14
15 if(.not. c_associated(my_c_ptr, my_c_ptr)) then
16 call abort()
17 end if
18
19 if(.not. c_associated(my_c_ptr, my_c_ptr, my_c_ptr)) then ! { dg-error "More actual than formal arguments" }
20 call abort()
21 end if
22
23 if(.not. c_associated()) then ! { dg-error "Missing argument" }
24 call abort()
25 end if ! { dg-error "Expecting END SUBROUTINE" }
26
27 if(.not. c_associated(my_c_ptr_2)) then
28 call abort()
29 end if
30
31 if(.not. c_associated(my_integer)) then ! { dg-error "Type/rank mismatch" }
32 call abort()
33 end if
34 end subroutine sub0
35
36 end module c_assoc_2
This page took 0.038085 seconds and 5 git commands to generate.