Searched refs:XX (Results 1 - 25 of 31) sorted by relevance

12

/haiku-buildtools/gcc/gcc/testsuite/g++.dg/init/
H A Dconstant1.C6 const uint32 XX[] = { 1, 3, 7 }; variable
9 *(((const uint8*)&XX[0]) + 0),
10 *(((const uint8*)&XX[0]) + 1),
11 *(((const uint8*)&XX[0]) + 2),
12 *(((const uint8*)&XX[0]) + 3),
13 *(((const uint8*)&XX[1]) + 0),
14 *(((const uint8*)&XX[1]) + 1),
15 *(((const uint8*)&XX[1]) + 2),
16 *(((const uint8*)&XX[1]) + 3),
/haiku-buildtools/legacy/binutils/opcodes/
H A Di386-dis.c205 #define XX NULL, 0 macro
520 { "addB", Eb, Gb, XX },
521 { "addS", Ev, Gv, XX },
522 { "addB", Gb, Eb, XX },
523 { "addS", Gv, Ev, XX },
524 { "addB", AL, Ib, XX },
525 { "addS", eAX, Iv, XX },
526 { "push{T|}", es, XX, XX },
527 { "pop{T|}", es, XX, X
[all...]
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.mike/
H A Dpmd1.C4 struct XX { int A::*py; }; struct
9 void setp(XX *xp);
12 void A::setp(XX *xp) { xp->py = &A::p; }
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/compile/
H A D20020910-1.c11 } XX; typedef in typeref:struct:__anon1402
13 static XX yy;
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Delemental_non_intrinsic_dummy_1.f9018 INTEGER FUNCTION SUB(XX)
19 INTEGER :: XX local in function:SUB
20 SUB=XX()
H A Dgeneric_13.f902 ! tests the patch for PR30870, in which the generic XX was rejected
22 SUBROUTINE XX(I)
26 CALL XX(I)
/haiku-buildtools/binutils/gas/testsuite/gas/mmix/
H A Dresume-op.s5 RESUME XX
7 XX IS 0 label
H A Dresume-op.l8 5 000c F9000000 RESUME XX
10 7 XX IS 0
18 \*ABS\*:0000000000000000 XX
/haiku-buildtools/legacy/binutils/gas/testsuite/gas/mmix/
H A Dresume-op.s5 RESUME XX
7 XX IS 0 label
H A Dresume-op.l8 5 000c F9000000 RESUME XX
10 7 XX IS 0
18 \*ABS\*:0000000000000000 XX
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.pt/
H A Dmemtemp89.C11 template<template<class> class XX>
13 XX<int> x_;
H A Dmemtemp88.C10 template<template<class> class XX = X> // { dg-bogus "" } (original definition appeared here)
12 }; // { dg-bogus "" } redefinition of default argument for `template <class> XX'
H A Dttp56.C13 template<template<class XX> class AA> // { dg-bogus "" } `template <class XX> template <class X> class A<X>' previously declared here
24 C<A> c; // { dg-bogus "" } redefinition of `template <class XX> template <class X> class A<X>'
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/tree-ssa/
H A Dpr14814.c9 struct XX { struct
13 static inline struct YY direction (const struct XX* this_1) { return this_1->v;}
15 int foo(const struct XX* r) {
/haiku-buildtools/gcc/gcc/testsuite/gcc.target/i386/
H A Dpr59133.c4 #define XX 0 macro
20 xt=x[ii][XX];
23 x[ii][XX]=trans[XX][XX]*xt+trans[XX][YY]*yt+trans[XX][ZZ]*zt;
24 x[ii][YY]=trans[YY][XX]*xt+trans[YY][YY]*yt+trans[YY][ZZ]*zt;
25 x[ii][ZZ]=trans[ZZ][XX]*xt+trans[ZZ][YY]*yt+trans[ZZ][ZZ]*zt;
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/tree-ssa/
H A Dpr14814.C9 class XX { public: class
13 int foo(XX& r) {
/haiku-buildtools/gcc/gcc/testsuite/g++.dg/template/
H A Dconv14.C3 class XX;
22 class AutoCleanVariant : public Variant<XX*, int> {
24 AutoCleanVariant(XX* st, int i) : Variant<XX*,int>(st,i) {}
28 return Variant<XX*, int>::operator T();
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.jason/
H A Dreturn.C10 X(X const &XX) { c = 1; } argument
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.robertl/
H A Deb49.C17 template<class T, class U> class XX;
25 friend class XX<T, U>;
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.other/
H A Drtti1.C39 class XX { class
55 int XX::*ptmd1;
56 int XX::*ptmd2;
57 float XX::*ptmd3;
60 int (XX::*ptmf1) ();
61 int (XX::*ptmf2) ();
62 int (XX::*ptmf3) (int);
H A Ddyncast1.C83 class XX : BB, E {}; class in inherits:BB,E
90 XX xx;
91 if(dynamic_cast<XX*>((B*)(CC*)(E*)&xx)) error(21);
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/vmx/
H A D7-01.c11 vector signed char d, unsigned int N, int XX)
18 high = (vector unsigned char) (vec_vmrghh (load(image, i+XX),
20 low = (vector unsigned char) (vec_vmrglh (load(image, i+XX),
10 haar(vector signed char a, vector signed char b, vector signed char c, vector signed char d, unsigned int N, int XX) argument
H A D7-01a.c11 vector signed char d, unsigned int N, int XX)
18 high = (vector unsigned char) (vec_vmrghh (load(image, i+XX),
20 low = (vector unsigned char) (vec_vmrglh (load(image, i+XX),
10 haar(vector signed char a, vector signed char b, vector signed char c, vector signed char d, unsigned int N, int XX) argument
/haiku-buildtools/binutils/gas/testsuite/gas/mt/
H A Dmsys.s39 fbcbdr R0,#0,R0,#0,#0,#0,#0,#0,#XX,#0
/haiku-buildtools/legacy/binutils/gas/testsuite/gas/mt/
H A Dmsys.s39 fbcbdr R0,#0,R0,#0,#0,#0,#0,#0,#XX,#0

Completed in 243 milliseconds

12