Searched refs:proc (Results 1 - 25 of 251) sorted by relevance

1234567891011

/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/compile/
H A D20010114-1.c2 /* In the declaration of proc, x cannot be parsed as a typedef name,
5 void proc(int (*x)(void)) {} function
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dintrinsic_actual_4.f907 subroutine sub (proc, chr)
8 external proc
9 integer proc local in subroutine:sub
11 if (proc (chr) .ne. 6) call abort ()
H A Dpure_formal_proc_3.f907 pure function f(proc)
9 function proc() ! { dg-error "must also be PURE" }
H A Dpr42119.f9012 subroutine Check(proc)
13 type(C_FUNPTR) :: proc local in subroutine:Check
21 type(C_FUNPTR) :: proc variable in program:Main
H A Dsizeof_2.f9011 procedure() :: proc
21 ii = sizeof (proc) ! { dg-error "shall not be a procedure" }
22 ii = c_sizeof (proc) ! { dg-error "Procedure unexpected as argument" }
23 ii = storage_size (proc) ! { dg-error "shall not be a procedure" }
H A Dproc_ptr_comp_14.f9010 procedure(proc), nopass, pointer :: proc => null ()
16 obj1%proc => proc
19 if (obj2%proc()/=7) call abort()
26 call assign_proc_ptr (obj2%proc, obj1)
30 procedure(proc), pointer :: ptr
32 ptr => obj1%proc
35 integer function proc () function in program:foo
36 proc
[all...]
H A Dintrinsic_actual_1.f8 subroutine foo (proc, z)
9 external proc
10 real proc, z local in subroutine:foo
11 if ((proc(z) .ne. abs (z)) .and.
12 & (proc(z) .ne. alog10 (abs(z)))) call abort ()
H A Dclass_56.f9018 subroutine proc(self) subroutine in module:lib_container
20 end subroutine proc
H A Dproc_decl_28.f9013 procedure(sub) :: proc
H A Dproc_ptr_comp_1.f9012 procedure(), pointer, nopass :: proc
37 x%proc => sub2
38 call x%proc(x)
42 x%proc => sub
43 call x%proc(4)
45 x2%proc => sub
46 call x2%proc(5)
H A Dproc_ptr_comp_41.f9028 SUBROUTINE some_proc(proc)
29 PROCEDURE(parent_proc) :: proc
31 CALL proc(a)
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/
H A Ddecl-1.c5 In the declaration of proc, x must be parsed as a typedef name (C99
15 int proc(int (x)); /* x is a typedef, param to proc is a function. */
27 proc (proc2); /* { dg-bogus "integer from pointer" } */
28 return proc3 (proc); /* { dg-bogus "incompatible pointer type" } */
/haiku-buildtools/legacy/gcc/libf2c/libF77/
H A Dsignal_.c6 G77_signal_0 (sigp, proc) integer *sigp; sig_pf proc;
9 G77_signal_0 (integer *sigp, sig_pf proc)
15 return (void *) signal(sig, proc);
/haiku-buildtools/cloog/test/
H A Dyosr2.c5 for (proc=2;proc<=M-1;proc++) {
6 for (i=1;i<=proc-1;i++) {
7 S4(i,proc) ;
9 for (j=1;j<=proc-1;j++) {
10 S1(proc,j) ;
12 for (j=proc+1;j<=M;j++) {
13 for (k=1;k<=proc-1;k++) {
14 S3(proc,
[all...]
H A Dyosrf.f6 DO proc=2, n-1
7 DO i=1, proc-1
9 S2(i,j,proc)
12 DO j=proc+1, n
13 S1(proc,j)
H A Dyosr.c6 for (proc=2;proc<=n-1;proc++) {
7 for (i=1;i<=proc-1;i++) {
9 S2(i,j,proc) ;
12 for (j=proc+1;j<=n;j++) {
13 S1(proc,j) ;
H A Dyosr2.good.c18 int proc; local
24 for (proc=2;proc<=M-1;proc++) {
25 for (i=1;i<=proc-1;i++) {
26 S4(i,proc) ;
28 for (j=1;j<=proc-1;j++) {
29 S1(proc,j) ;
31 for (j=proc+1;j<=M;j++) {
32 for (k=1;k<=proc
[all...]
/haiku-buildtools/gcc/gcc/testsuite/gfortran.fortran-torture/execute/
H A Dintrinsic_dummy.f903 subroutine test (proc)
5 real proc local in subroutine:test
10 c = proc (a)
/haiku-buildtools/binutils/gas/testsuite/gas/hppa/parse/
H A Dcallinfobug.s4 .proc
/haiku-buildtools/legacy/binutils/gas/testsuite/gas/hppa/parse/
H A Dcallinfobug.s4 .proc
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.brendan/
H A Dptrmem1.C7 my_class (int num, func_type* proc);
14 my_class::my_class (int num, func_type* proc) : _num(num), _proc(proc) argument
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/execute/
H A Dnestfunc-5.c5 static void recursive (int n, void (*proc) (void))
17 recursive (n - 1, proc);
19 (*proc) ();
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/torture/stackalign/
H A Dnested-5.c7 static void recursive (int n, void (*proc) (void))
19 recursive (n - 1, proc);
21 (*proc) ();
/haiku-buildtools/binutils/gas/testsuite/gas/ia64/
H A Dproc.s4 .proc func, func1, func2
12 .proc
/haiku-buildtools/legacy/binutils/gas/testsuite/gas/ia64/
H A Dproc.s4 .proc func, func1, func2
12 .proc

Completed in 124 milliseconds

1234567891011