2 ! { dg-options "-fcoarray=single" }
7 ! Copied from assumed_type_2.f90
9 subroutine one(a
) ! { dg-error "may not have the ALLOCATABLE, CODIMENSION, POINTER or VALUE attribute" }
10 !GCC$ attributes NO_ARG_CHECK :: a
14 subroutine two(a
) ! { dg-error "may not have the ALLOCATABLE, CODIMENSION, POINTER or VALUE attribute" }
15 !GCC$ attributes NO_ARG_CHECK :: a
19 subroutine three(a
) ! { dg-error "may not have the ALLOCATABLE, CODIMENSION, POINTER or VALUE attribute" }
20 !GCC$ attributes NO_ARG_CHECK :: a
21 integer, allocatable
:: a
24 subroutine four(a
) ! { dg-error "may not have the ALLOCATABLE, CODIMENSION, POINTER or VALUE attribute" }
25 !GCC$ attributes NO_ARG_CHECK :: a
29 subroutine five(a
) ! { dg-error "with NO_ARG_CHECK attribute shall either be a scalar or an assumed-size array" }
30 !GCC$ attributes NO_ARG_CHECK :: a
35 !GCC$ attributes NO_ARG_CHECK :: nodum ! { dg-error "with NO_ARG_CHECK attribute shall be a dummy argument" }
40 !GCC$ attributes NO_ARG_CHECK :: y
42 call a7(y(3:5)) ! { dg-error "with NO_ARG_CHECK attribute shall not have a subobject reference" }
45 !GCC$ attributes NO_ARG_CHECK :: x
53 !GCC$ attributes NO_ARG_CHECK :: x
58 subroutine ambig1(x
) ! { dg-error "Ambiguous interfaces" }
59 !GCC$ attributes NO_ARG_CHECK :: x
62 subroutine ambig2(x
) ! { dg-error "Ambiguous interfaces" }
63 !GCC$ attributes NO_ARG_CHECK :: x
68 subroutine ambig3(x
) ! { dg-error "Ambiguous interfaces" }
69 !GCC$ attributes NO_ARG_CHECK :: x
72 subroutine ambig4(x
) ! { dg-error "Ambiguous interfaces" }
85 procedure
, nopass
:: proc
=> bar
88 call sub(xx
) ! { dg-error "is of derived type with type-bound or FINAL procedures" }
91 !GCC$ attributes NO_ARG_CHECK :: a
98 !GCC$ attributes NO_ARG_CHECK :: x
100 call bar(x
) ! { dg-error "Assumed-type argument x at .1. requires an explicit interface" }
101 end subroutine eleven
104 !GCC$ attributes NO_ARG_CHECK :: x
106 call bar(x
) ! { dg-error "Type mismatch in argument" }
113 subroutine thirteen(x
, y
)
114 !GCC$ attributes NO_ARG_CHECK :: x
117 print *, ubound(y
, dim
=x
) ! { dg-error "Variable with NO_ARG_CHECK attribute at .1. is only permitted as argument to the intrinsic functions C_LOC and PRESENT" }
118 end subroutine thirteen
120 subroutine fourteen(x
)
121 !GCC$ attributes NO_ARG_CHECK :: x
123 x
= x
! { dg-error "with NO_ARG_CHECK attribute may only be used as actual argument" }
124 end subroutine fourteen