Searched refs:AA (Results 1 - 25 of 57) sorted by relevance

123

/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.law/
H A Dvisibility14.C12 struct AA { struct in class:A
13 AA();
14 ~AA();
18 A::AA::~AA()
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.other/
H A Ddefarg8.C13 struct AA struct
21 AA::Foo ();
22 AA::Foo (1);
23 AA::Baz ();
24 AA::Baz (1);
H A Ddtor9.C13 class AA : public virtual BB class in inherits:BB
20 AA xx;
H A Dcrash15.C10 class AA {}; class
12 void fee (const AA&);
22 AA get_allocator();
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/gomp/appendix-a/
H A Da.11.7.f902 SUBROUTINE A11_7(AA, BB, CC, N)
4 REAL AA(N), BB(N), CC(N) local in subroutine:A11_7
7 AA(1:50) = BB(11:60)
8 CC(11:20) = AA(1:10)
H A Da.11.3.f902 SUBROUTINE A11_3(AA, BB, CC, DD, N)
4 REAL AA(N,N), BB(N,N), CC(N,N), DD(N,N) local in subroutine:A11_3
9 AA = BB
11 R = R + SUM(AA)
H A Da.11.5.f902 SUBROUTINE A11_5(AA, BB, CC, DD, N)
4 REAL AA(N,N), BB(N,N), CC(N,N), DD(N,N) local in subroutine:A11_5
8 AA = BB
H A Da.11.6.f903 SUBROUTINE A11_6_WRONG(AA, BB, CC, DD, N)
5 REAL AA(N,N), BB(N,N), CC(N,N), DD(N,N) local in subroutine:A11_6_WRONG
9 AA = BB
H A Da.11.1.f902 SUBROUTINE A11_1(AA, BB, CC, DD, EE, FF, N)
4 REAL AA(N,N), BB(N,N), CC(N,N), DD(N,N), EE(N,N), FF(N,N) local in subroutine:A11_1
7 AA = BB
H A Da.11.2.f903 SUBROUTINE A11_2(AA, BB, CC, DD, EE, FF, N)
5 REAL AA(N,N), BB(N,N), CC(N,N) local in subroutine:A11_2
9 AA = BB
H A Da.11.4.f903 SUBROUTINE A11_4(AA, BB, CC, DD, EE, FF, GG, HH, N)
5 REAL AA(N,N), BB(N,N), CC(N,N) local in subroutine:A11_4
10 AA = BB
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dproc_ptr_47.f906 type AA type
10 class(AA), allocatable :: my_AA
11 type(AA) :: res
13 allocate (my_AA, source = AA (1, foo))
24 class(AA), allocatable :: A
25 type(AA) foo
28 allocate (A, source = AA (2, foo))
32 type is (AA)
33 foo = AA (3, foo)
34 A = AA (
[all...]
/haiku-buildtools/binutils/gas/testsuite/gas/tic54x/
H A Din_mlib.asm1 IN_MLIB .macro AA,BB,CC
2 ADD #AA,a
/haiku-buildtools/legacy/binutils/gas/testsuite/gas/tic54x/
H A Din_mlib.asm1 IN_MLIB .macro AA,BB,CC
2 ADD #AA,a
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.brendan/
H A Dtemplate26.C9 template <int I> class AA: public virtual V { class in inherits:V
11 AA();
12 AA(int);
21 template <int I> AA<I>::AA() {} function in class:AA
22 template <int I> AA<I>::AA(int i): V(i) {} function in class:AA
26 class CC : public AA<1>, public BB<2> {
H A Dvisibility9.C8 class AA : A { }; class in inherits:A
13 AA ana;
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.jason/
H A Denum7.C4 enum A { AA = 0, AB = 1}; enumerator in enum:A
13 set(AA); // { dg-bogus "" } why is this ambiguous
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.pt/
H A Dt22.C3 class AA { public: static int xx; }; class
9 int AA::xx;
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/tree-prof/
H A Dindir-call-prof.C6 virtual int AA (void) function in struct:A
14 virtual int AA (void) function in struct:B
28 p->AA ();
31 p->AA ();
36 /* { dg-final-use { scan-ipa-dump "Indirect call -> direct call.* AA transformation on insn" "profile" } } */
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/parse/
H A Dcrash40.C11 class AA class
15 struct BB : AA {};
35 BB().AA::foo<0>(); /* { dg-error "within this context" } */
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/cpp0x/
H A Dconstexpr-55708.C5 struct AA { static constexpr int val = N; }; struct
16 return AA<1, mymax(1,2)>::val; // <-- crashes gcc
18 // return AA<1,2>::val; // <-- compiles
24 return AA<1, mymax(1,2)>::val; // <-- crashes gcc
H A Dinitlist7.C4 typedef enum { AA=1, BB=2 } my_enum; enumerator in enum:__anon886
/haiku-buildtools/gcc/gcc/testsuite/gfortran.fortran-torture/execute/
H A Dfunction_module_1.f907 subroutine AA () subroutine in module:M1
34 call AA ()
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/template/
H A Dqualttp13.C6 template <class V> struct AA { struct in struct:A
21 X<T::template AA<U>::template B> x;
H A Dtemplate-id-4.C5 template<class AA>

Completed in 121 milliseconds

123