Searched refs:dt (Results 1 - 25 of 209) sorted by relevance

123456789

/haiku-buildtools/gcc/gcc/testsuite/g++.dg/cpp0x/
H A Dnsdmi12.C6 struct dt struct
7 { dt() {} ~ dt() {} }; function in struct:dt
10 std::initializer_list< dt > f = { {} };
14 struct dt { ~ dt() {} } struct in struct:x2
H A Dconstexpr-bitfield2.C17 constexpr date dt(d);
18 static_assert (dt.d == 0, "Error");
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/coarray/
H A Dcollectives_3.f9019 type(t) :: dt(4) variable in program:test
26 dt = t(1, 'C', [1.,2.,3.], [3,3,3])
35 dt = t(-1, 'a', [3.,1.,8.], [99,24,5])
64 call co_broadcast(dt, source_image=num_images(), stat=stat, errmsg=errstr)
67 if (any (dt(:)%i /= -1)) call abort()
68 if (any (dt(:)%c /= 'a')) call abort()
69 if (any (dt(:)%x(1) /= 3.)) call abort()
70 if (any (dt(:)%x(2) /= 1.)) call abort()
71 if (any (dt(:)%x(3) /= 8.)) call abort()
72 if (any (dt(
[all...]
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Dpr43688.f908 type(a), target :: dt(2) local in subroutine:sub
10 ip => dt%i
H A Dfunction_optimize_9.f907 real, parameter :: dt = tmax/(2*pi)/real(n) variable in program:main
8 real, parameter :: t0 = dt/30.
18 a(i) = purefunc(dt*i + t0) * 3. + 2 * purefunc(t0 + i*dt)
H A Dstreamio_9.f907 real dt, t, u, a(10), b(10) variable in program:pr29053
9 dt = 1.e-6
15 t = i * dt
22 t = i * dt
H A Dassociated_4.f909 type dt type
11 end type dt
12 type(dt) :: obj(2)
H A Dchar_array_structure_constructor.f9013 TYPE :: dt type in module:global
17 TYPE (dt), DIMENSION(:), ALLOCATABLE, SAVE :: c
30 c (i) = dt ("wxyz",(/"abcd","efgh"/))
H A Dchar_pointer_comp_assign.f909 type :: dt type in program:char_pointer_comp_assign
12 end type dt
13 type (dt) :: a
H A Dvalue_1.f9014 subroutine typhoo (dt)
15 type(mytype), value :: dt
16 if (dtne (dt, mytype (42.0, "lmno"))) call abort ()
17 dt = mytype (21.0, "wxyz")
18 if (dtne (dt, mytype (21.0, "wxyz"))) call abort ()
34 type(mytype) :: dt = mytype (42.0, "lmno") variable in program:test_value
48 call typhoo (dt)
49 if (dtne (dt, mytype (42.0, "lmno"))) call abort ()
H A Dichar_1.f9034 type(derivedtype) :: dt variable in program:ichar_1
61 i = ichar(dt%addr(1:1))
62 i = ichar(dt%addr) ! { dg-error "must be of length one" "" }
63 i = ichar(dt%addr(1:2)) ! { dg-error "must be of length one" "" }
64 i = ichar(dt%addr(1:)) ! { dg-error "must be of length one" "" }
H A Dnamelist_14.f9020 type(mt) :: dt(2) variable in program:namelist_14
26 dt = mt ((/99,999,9999,99999/))
28 call foo (i,dt,pi,chs,cha)
40 subroutine foo (i, dt, pi, chs, cha)
48 type(mt) :: dt(2) !dummy arg., derived array local in subroutine:foo
56 namelist /z/ dt, dtl, dts, cdt, j, jj, i, pi, chs, chl, cha local in subroutine:foo
70 dt = mt ((/0, 0, 0, 0/))
82 if (.not.(dttest (dt(1), mt ((/99,999,9999,99999/))) .and. &
83 dttest (dt(2), mt ((/99,999,9999,99999/))) .and. &
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/gomp/
H A Dudr6.f905 type dt type in module:udr6
10 use udr6, only : dt
20 use udr6, only : dt
21 type(dt), intent (in) :: x, y
22 type(dt) :: addf1
27 use udr6, only : dt
30 use udr6, only : dt
31 type(dt), intent (in) :: x, y
32 type(dt) :: subf2
44 use udr6, only : dt
[all...]
H A Dudr2.f9032 type dt ! { dg-error "which is not consistent with the CALL" } type in subroutine:f9
35 end type dt
37 !$omp declare reduction (foo:integer:dt (omp_out, omp_in)) ! { dg-error "which is not consistent with the CALL" }
39 !$omp & initializer (dt (omp_priv, omp_orig)) ! { dg-error "which is not consistent with the CALL" }
H A Dudr7.f904 type dt type in module:udr7m1
6 end type dt
13 !$omp declare reduction(+:dt:omp_out=omp_out+omp_in) &
14 !$omp & initializer(omp_priv=dt(0.0))
15 !$omp declare reduction(.myadd.:dt:omp_out=omp_out.myadd.omp_in) &
16 !$omp & initializer(omp_priv=dt(0.0))
21 public :: operator(+), operator(.myadd.), dt
23 type(dt) function addm2 (x, y)
24 type(dt), intent (in):: x, y
31 public :: operator(.myadd.), operator(+), dt
[all...]
H A Dudr5.f904 type dt type in module:udr5m1
6 end type dt
13 !$omp declare reduction(+:dt:omp_out=omp_out+omp_in) &
14 !$omp & initializer(omp_priv=dt(0.0))
15 !$omp declare reduction(.myadd.:dt:omp_out=omp_out.myadd.omp_in) &
16 !$omp & initializer(omp_priv=dt(0.0))
21 type(dt) function addm2 (x, y)
22 type(dt), intent (in):: x, y
31 !$omp declare reduction(+:dt:omp_out=omp_out+omp_in) &
32 !$omp & initializer(omp_priv=dt(0.
[all...]
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.robertl/
H A Deb127.C13 void eulerODE(vector<double>& y, double& t, double& dt);
14 void midpointODE(vector<double>& y, double& t, double& dt);
22 void timeloop(vector<double>& y, double ts, double te, double dt);
32 void ODEsolver::eulerODE(vector<double>& y, double& t, double& dt) argument
34 y[0] = dt * 2.;
37 void ODEsolver::midpointODE(vector<double>& y, double& t, double& dt) argument
39 y[0] = dt * 3.;
49 void ODEsolver::timeloop(vector<double>& y, double ts, double te, double dt) argument
51 (ODEsolver::useMethod)(y,ts,dt); // { dg-error "" } should use this->*
57 vector<double> y(2); double t_start=5.; double t_end=7.; double dt local
[all...]
/haiku-buildtools/gcc/libgomp/testsuite/libgomp.fortran/
H A Dudr1.f904 type dt type in module:udr1
9 use udr1, only : dt
14 type (dt) :: d
15 !$omp declare reduction (+ : dt : omp_out%x = omp_out%x &
17 !$omp declare reduction (foo : dt : omp_out%x = iand (omp_in%x, -8) &
18 !$omp & + omp_out%x) initializer (omp_priv = dt (5, 21))
21 use udr1, only : dt
22 type(dt), intent (in) :: x, y
23 type(dt) :: notdefined
44 d = dt (
[all...]
H A Dudr2.f904 type dt type in module:udr2
9 use udr2, only : dt
16 use udr2, only : dt
17 type(dt), intent (in) :: x, y
18 type(dt) :: notdefined
21 type (dt) :: d(2:4,3:5)
22 !$omp declare reduction (+ : dt : omp_out%x = omp_out%x &
24 !$omp declare reduction (foo : dt : omp_out%x = iand (omp_in%x, -8) &
25 !$omp & + omp_out%x) initializer (omp_priv = dt (5, 21))
44 d = dt (
[all...]
H A Dudr11.f904 type dt type in module:udr11
8 use udr11, only : dt
9 !$omp declare reduction(+:dt:omp_out%x=omp_out%x+omp_in%x)
10 !$omp declare reduction(-:dt:omp_out%x=omp_out%x+omp_in%x)
11 !$omp declare reduction(*:dt:omp_out%x=omp_out%x+omp_in%x)
12 !$omp declare reduction(.and.:dt:omp_out%x=omp_out%x+omp_in%x)
13 !$omp declare reduction(.or.:dt:omp_out%x=omp_out%x+3*omp_in%x)
14 !$omp declare reduction(.eqv.:dt:omp_out%x=omp_out%x+omp_in%x)
15 !$omp declare reduction(.neqv.:dt:omp_out%x=omp_out%x+omp_in%x)
16 !$omp declare reduction(min:dt
[all...]
H A Dudr8.f9021 type dt type in module:udr8m2
24 !$omp declare reduction (+ : dt : omp_out = omp_out + omp_in) &
25 !$omp & initializer (omp_priv = dt (0))
30 type(dt) function f2 (x, y)
31 type(dt), intent (in) :: x, y
37 type(dt) :: d
43 d = d + dt(i)
H A Dudr9.f9032 type dt type in module:udr9m2
35 !$omp declare reduction (+ : dt : combiner2 (omp_in, omp_out)) &
41 type(dt) function f2 (x, y)
42 type(dt), intent (in) :: x, y
46 type(dt) :: x, y
50 type(dt), intent(out) :: x
56 type(dt) :: d
62 d = d + dt(i)
H A Dudr15.f9030 type dt type in module:udr15m2
33 !$omp declare reduction (+ : dt : omp_out = f6 (omp_out + omp_in)) &
39 type(dt) function f2 (x, y)
40 type(dt), intent (in) :: x, y
43 type(dt) function f6 (x)
44 type(dt), intent (in) :: x
48 type(dt), intent (out) :: x
49 x = dt(0)
55 type(dt) :: d
61 d = d + dt(
[all...]
H A Dudr6.f907 type dt type in module:m
12 type (dt), intent (in) :: x, y
13 type (dt) :: do_add
28 use m, only : operator(.add.), dt, dp_add, dp_init
29 type(dt), allocatable :: xdt(:)
30 type(dt) :: one
37 !$omp declare reduction(.add.:dt:omp_out=omp_out.add.omp_in)
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/execute/
H A D960416-1.c2 typedef unsigned long long dt; typedef
5 dt d;
15 dt d;
39 lp.d = (dt) afh.s.l * bfh.s.l; \
40 hp.d = (dt) afh.s.h * bfh.s.h; \
41 dp.d = (dt) ad *bd; \
44 m.d = (dt) lp.s.h + hp.s.l + lp.s.l + dp.s.l; \

Completed in 373 milliseconds

123456789