Searched refs:sub2 (Results 1 - 25 of 82) sorted by relevance

1234

/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dhost_assoc_call_1.f902 ! Tests the fix for PR31494, where the call of sub2 would reference
8 REAL, DIMENSION(1) :: sub2 variable in module:ksbin2_aux_mod
11 CALL sub2
13 SUBROUTINE sub2 subroutine in subroutine:sub1
14 END SUBROUTINE sub2
H A Duse_10.f908 module procedure sub2
17 function sub2(i) function in module:a
18 integer :: sub2 local in function:sub2
20 sub2 = i
21 end function sub2
H A Doptional_assumed_charlen_1.f9015 SUBROUTINE sub2 subroutine in module:foo
17 END SUBROUTINE sub2
H A Dactual_rank_check_1.f9011 call sub2(i) ! { dg-error "scalar and rank-2" }
12 call sub2(j)
19 subroutine sub2(i2) subroutine
22 end subroutine sub2
H A Dconstructor_7.f9038 type t2 ! { dg-error "Fortran 2003: Generic name 't2' of function 'sub2' at .1. being the same name as derived type at" }
42 module procedure sub2
45 integer function sub2() ! { dg-error "Fortran 2003: Generic name 't2' of function 'sub2' at .1. being the same name as derived type at" } function in module:m3
46 sub2 = 4
47 end function sub2
H A Dinterface_30.f9016 call sub2(func2)
18 call sub2(func3) ! { dg-error "is not a subroutine" }
19 call sub2(func4)
29 subroutine sub2(a2) subroutine in program:test
H A Dminmaxloc_7.f9012 call sub2 (minloc(A),11)
13 call sub2 (maxloc(A, mask=mask),9)
17 subroutine sub2(A,n) subroutine in program:test
20 end subroutine sub2
H A Dproc_ptr_21.f902 ! Tests the fix for PR40591 in which the interface 'sub2'
16 procedure(sub2), pointer :: pptr2
21 pptr1 => sub2
25 pptr2 => sub2
29 subroutine sub2(arg) subroutine in program:main
32 end subroutine sub2
H A Diso_c_binding_rename_2_driver.c1 void sub2(int **);
11 sub2(&ptr);
H A Dargument_checking_18.f9019 call sub2 (i) ! { dg-error "Rank mismatch in argument" }
20 call sub2 (tt%j) ! { dg-error "Rank mismatch in argument" }
29 subroutine sub2(i) subroutine
31 print *,"sub2:",i
H A Dparent_result_ref_3.f9014 call sub2 ()
20 subroutine sub2 subroutine in function:f
22 end subroutine sub2
H A Dintent_out_6.f908 subroutine sub2(a) subroutine in module:test_module
16 end subroutine sub2
21 call sub2(a)
H A Ddeferred_character_12.f9017 subroutine sub2(mystring) subroutine in module:mymod
22 end subroutine sub2
33 call sub2(mywrapper%string)
H A Dcompiler-directive_1.f9012 subroutine sub2()
13 !GCC$ ATTRIBUTES CDECL :: sub2
14 end subroutine sub2
33 cdecl => sub2
43 stdcall => sub2 ! { dg-error "mismatch in the calling convention" }
46 fastcall => sub2 ! { dg-error "mismatch in the calling convention" }
H A Dargument_checking_17.f9015 subroutine sub2(string,str_size) subroutine in module:teststr
19 end subroutine sub2
22 call sub2(a%mdr(GRH_SIZE+1),a%size-GRH_SIZE)
H A Dold_style_init.f9013 subroutine sub2 subroutine
H A Dbind_c_bool_1.f907 function sub2() bind(C) ! { dg-error "GNU Extension: LOGICAL result variable 'sub2' at .1. with non-C_Bool kind in BIND.C. procedure 'sub2'" } function
8 logical(kind=8) :: sub2 local in function:sub2
10 end function sub2
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.mike/
H A Dasm2.C8 sub2 (void (*func) ()) function
18 sub2 (sub);
/haiku-buildtools/gcc/gcc/testsuite/gfortran.fortran-torture/execute/
H A Dcontained_3.f9013 sub = sub2(i) * i
18 integer function sub2(i) function in program:contained_3
20 sub2 = sub(i - 1)
H A Dstack_varsize.f904 call sub2 (1)
23 recursive subroutine sub2 (n) subroutine in program:stack
26 if (n .ge. 1) call sub2 (n-1)
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/compile/
H A D20020309-1.c8 sub2 () function
H A Dconst-high-part.c16 sub2 (void) function
/haiku-buildtools/binutils/ld/testsuite/ld-powerpc/
H A Dvle-reloc-1.s5 sub2: label
12 se_bc 0,1,sub2
13 se_bc 1,2,sub2
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/execute/
H A D930929-1.c7 sub2 (i) function
29 if (sub2 (20) != 45)
H A D961206-1.c11 sub2 (unsigned long long i) function
42 if (sub2 (0x80000000ULL))

Completed in 107 milliseconds

1234