lto: Remove random_seed from section name.
[official-gcc.git] / gcc / testsuite / gfortran.dg / bind_c_usage_9.f03
blob016fc7f62e06cb399d34ec3023c7a12e83eed0ae
1 ! { dg-do compile }
2 ! { dg-options "-std=f2003" }
3 ! PR fortran/34133
5 ! The compiler should reject internal procedures with BIND(c) attribute
6 ! for Fortran 2003.
8 subroutine foo() bind(c)
9 contains ! { dg-error "Fortran 2008: CONTAINS statement" }
10   subroutine bar() bind (c) ! { dg-error "may not be specified for an internal" }
11   end subroutine bar ! { dg-error "Expected label" }
12 end subroutine foo
14 subroutine foo2() bind(c)
15   use iso_c_binding
16 contains ! { dg-error "Fortran 2008: CONTAINS statement" }
17   integer(c_int) function barbar() bind (c) ! { dg-error "may not be specified for an internal" }
18   end function barbar ! { dg-error "Expecting END SUBROUTINE" }
19 end subroutine foo2
21 function one() bind(c)
22   use iso_c_binding
23   integer(c_int) :: one
24   one = 1
25 contains ! { dg-error "Fortran 2008: CONTAINS statement" }
26   integer(c_int) function two() bind (c) ! { dg-error "may not be specified for an internal" }
27   end function two ! { dg-error "Expected label" }
28 end function one
30 function one2() bind(c)
31   use iso_c_binding
32   integer(c_int) :: one2
33   one2 = 1
34 contains ! { dg-error "Fortran 2008: CONTAINS statement" }
35   subroutine three() bind (c) ! { dg-error "may not be specified for an internal" }
36   end subroutine three ! { dg-error "Expecting END FUNCTION statement" }
37 end function one2
39 program main
40   use iso_c_binding
41   implicit none
42 contains ! { dg-error "Fortran 2008: CONTAINS statement" }
43   subroutine test() bind(c) ! { dg-error "may not be specified for an internal" }
44   end subroutine test ! { dg-error "Expecting END PROGRAM" }
45   integer(c_int) function test2() bind (c) ! { dg-error "may not be specified for an internal" }
46   end function test2  ! { dg-error "Expecting END PROGRAM" }
47 end program main