File: bind_c_usage_12.f03

package info (click to toggle)
gcc-arm-none-eabi 15%3A14.2.rel1-1
  • links: PTS, VCS
  • area: main
  • in suites: forky, sid, trixie
  • size: 1,099,328 kB
  • sloc: cpp: 3,627,108; ansic: 2,571,498; ada: 834,230; f90: 235,082; makefile: 79,231; asm: 74,984; xml: 51,692; exp: 39,736; sh: 33,298; objc: 15,629; python: 15,069; fortran: 14,429; pascal: 7,003; awk: 5,070; perl: 3,106; ml: 285; lisp: 253; lex: 204; haskell: 135
file content (63 lines) | stat: -rw-r--r-- 2,011 bytes parent folder | download | duplicates (6)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
! { dg-do compile }
! { dg-options "-std=gnu" }
! PR fortran/34133
!
! bind(C,name="...") is invalid for dummy procedures
! and for internal procedures.
!
subroutine dummy1(a,b)
!  implicit none
  interface
    function b() bind(c,name="jakl") ! { dg-error "no binding name is allowed" }
!     use iso_c_binding
!     integer(c_int) :: b       
    end function b ! { dg-error "Expecting END INTERFACE" }
  end interface
  interface
    subroutine a() bind(c,name="") ! { dg-error "no binding name is allowed" }
    end subroutine a ! { dg-error "Expecting END INTERFACE" }
  end interface
end subroutine dummy1

subroutine internal()
  implicit none
contains
  subroutine int1() bind(c, name="jj") ! { dg-error "No binding name is allowed" }
  end subroutine int1 ! { dg-error "Expected label" }
end subroutine internal

subroutine internal1()
  use iso_c_binding
  implicit none
contains
  integer(c_int) function int2() bind(c, name="jjj") ! { dg-error "No binding name is allowed" }
  end function int2 ! { dg-error "Expecting END SUBROUTINE" }
end subroutine internal1

integer(c_int) function internal2()
  use iso_c_binding
  implicit none
  internal2 = 0
contains
  subroutine int1() bind(c, name="kk") ! { dg-error "No binding name is allowed" }
  end subroutine int1 ! { dg-error "Expecting END FUNCTION" }
end function internal2

integer(c_int) function internal3()
  use iso_c_binding
  implicit none
  internal3 = 0
contains
  integer(c_int) function int2() bind(c, name="kkk") ! { dg-error "No binding name is allowed" }
  end function int2 ! { dg-error "Expected label" }
end function internal3

program internal_prog
  use iso_c_binding
  implicit none
contains
  subroutine int1() bind(c, name="mm") ! { dg-error "No binding name is allowed" }
  end subroutine int1 ! { dg-error "Expecting END PROGRAM statement" }
  integer(c_int) function int2() bind(c, name="mmm") ! { dg-error "No binding name is allowed" }
  end function int2 ! { dg-error "Expecting END PROGRAM statement" } 
end program