Searched refs:dp (Results 1 - 25 of 246) sorted by relevance

12345678910

/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/
H A Drecursive_parameter_1.f909 integer, parameter :: dp = kind(1.0_dp) ! { dg-error "Missing kind-parameter" } variable in program:recursive_parameter
10 write(*,*) dp ! { dg-error "has no IMPLICIT type" }
H A Dpr32533.f907 INTEGER, PARAMETER :: dp=KIND(0.0D0) local in subroutine:T
8 REAL(dp) :: sab_max(3), subcells,nsubcell(3)
12 INTEGER, PARAMETER :: dp=KIND(0.0D0) variable
13 REAL(dp) :: sab_max(3), subcells,nsubcell(3)
H A Dpr41229.f904 INTEGER, PARAMETER :: dp=KIND(0.0D0) local in subroutine:cp_fm_triangular_multiply
5 REAL(dp), ALLOCATABLE, DIMENSION(:) :: tau, work
6 REAL(KIND=dp), DIMENSION(:, :), POINTER :: a
H A Darray_constructor_46.f906 integer, parameter :: dp=selected_real_kind(15) variable in program:main
7 real(kind=dp), dimension(2,2) :: a
8 real(kind=dp) thirteen
H A Dinternal_pack_4.f9011 INTEGER, PARAMETER :: dp=KIND(0.0D0) variable in module:M1
14 REAL(dp), DIMENSION(45), INTENT(OUT), &
19 REAL(dp), DIMENSION(:, :), INTENT(OUT), &
H A Darray_constructor_34.f9010 integer, parameter :: dp = selected_real_kind(15,300) variable in program:test
12 complex(dp) h1(0:N-1)
13 complex(dp) h2(0:N-1)
14 complex(dp) hh(0:N-1)
15 complex(dp), parameter :: ri(2) = (/(1,0),(0,1)/)
17 real(dp) pi
H A Derror_recovery_1.f906 something :: dp ! { dg-error "Unclassifiable statement" }
7 real (kind=dp) :: x ! { dg-error "has not been declared or is a variable, which does not reduce to a constant expression" }
H A Darray_function_2.f9012 integer, parameter :: dp = kind(1.0d0) variable in program:bounds_issue
13 real(dp), pointer :: pdf0(:,:), dpdf(:,:)
22 real(dp), intent(in) :: q_in(0:,-6:)
23 real(dp) :: Pxq(0:ubound(q_in,dim=1),-6:7)
H A Darray_constructor_47.f907 integer, parameter :: dp=selected_real_kind(15) variable in program:main
8 real(kind=dp), dimension(2,2) :: a
9 real(kind=dp) thirteen
16 real(kind=dp) :: eleven_ones(11)
H A Dpr32242.f906 INTEGER, PARAMETER :: dp=KIND(0.0D0) variable in module:kahan_sum
11 REAL (KIND=dp), DIMENSION ( : ), POINTER :: gsq
14 REAL (KIND=dp), DIMENSION ( : ), POINTER :: cr
15 COMPLEX (KIND=dp), DIMENSION ( : ), POINTER :: cc
20 REAL(KIND=dp), DIMENSION(:), INTENT(IN) :: array
23 REAL(KIND=dp) :: ks
26 COMPLEX(KIND=dp), DIMENSION(:), &
30 COMPLEX(KIND=dp) :: ks
35 REAL(KIND=dp) :: integral_value
37 * pw2 % cc ( : ) ,KIND=dp) * pw
[all...]
H A Dimport10.f9010 integer, parameter :: dp = kind(1.0) variable in module:select_precision
14 use select_precision, only: wp => dp
H A Dintrinsic_cmplx.f904 integer, parameter :: sp = kind(1.e0), dp = kind(1.d0) variable in program:test
6 complex(dp) :: d
H A Dinterface_17.f908 INTEGER, PARAMETER :: dp = SELECTED_REAL_KIND ( 14, 200 ) variable in module:kinds
12 USE kinds, ONLY: dp
/haiku-buildtools/gcc/gcc/testsuite/gcc.dg/
H A Dpr33666.c7 void __lock_get_list(void *dp) argument
9 if (((__SIZE_TYPE__)dp + 1) & ~1ULL)
H A DWincompatible-pointer-types.c17 float *dp = &di; local
18 di = dp;
19 fn2 (dp, di);
20 return dp;
/haiku-buildtools/gcc/gcc/testsuite/gfortran.fortran-torture/execute/
H A Dintrinsic_dprod.f905 double precision dp variable in program:intrinsic_dprod
10 dp = dprod (r, s)
11 if ((dp .gt. 8.001d60) .or. (dp .lt. 7.999d60)) call abort
H A Diolength_3.f908 dp = selected_real_kind(15, 307) variable in program:iolength_3
10 real(dp) :: c
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/compile/
H A Dpr33122.c11 const struct dis386 *dp; local
13 dp = &float_reg[i - 1][j];
/haiku-buildtools/gcc/gcc/testsuite/gcc.c-torture/execute/
H A D20030910-1.c8 double *dp = &(__real dc); local
9 *dp = 3.14;
/haiku-buildtools/gcc/gmp/mpz/
H A Dclrbit.c27 mp_ptr dp = d->_mp_d; local
36 dlimb = dp[limb_index];
38 dp[limb_index] = dlimb;
45 } while (dsize > 0 && dp[dsize-1] == 0);
66 if (dp[zero_bound] != 0)
72 dp[limb_index] |= (mp_limb_t) 1 << (bit_index % GMP_NUMB_BITS);
78 dp = _mpz_realloc (d, limb_index + 1);
80 MPN_ZERO (dp + dsize, limb_index - dsize);
81 dp[limb_index] = (mp_limb_t) 1 << (bit_index % GMP_NUMB_BITS);
87 dp[limb_inde
[all...]
H A Dcombit.c27 mp_ptr dp = LIMBS(d); local
35 dp = LIMBS(d);
37 MPN_ZERO(dp + dsize, limb_index + 1 - dsize);
43 dp[limb_index] ^= bit;
44 MPN_NORMALIZE (dp, dsize);
49 mp_limb_t x = -dp[limb_index];
54 if (dp[i] != 0)
66 dp = LIMBS(d);
68 __GMPN_ADD_1 (c, dp+limb_index, dp
[all...]
H A Dsetbit.c28 mp_ptr dp = d->_mp_d; local
36 dp[limb_index] |= (mp_limb_t) 1 << (bit_index % GMP_NUMB_BITS);
44 dp = _mpz_realloc (d, limb_index + 1);
45 MPN_ZERO (dp + dsize, limb_index - dsize);
46 dp[limb_index] = (mp_limb_t) 1 << (bit_index % GMP_NUMB_BITS);
64 if (dp[zero_bound] != 0)
72 dlimb = dp[limb_index];
74 dp[limb_index] = dlimb;
81 } while (dsize > 0 && dp[dsize-1] == 0);
88 dp[limb_inde
[all...]
/haiku-buildtools/gcc/gmp/mpn/generic/
H A Dinvert.c35 mpn_invert (mp_ptr ip, mp_srcptr dp, mp_size_t n, mp_ptr scratch) argument
38 ASSERT (dp[n-1] & GMP_NUMB_HIGHBIT);
39 ASSERT (! MPN_OVERLAP_P (ip, n, dp, n));
41 ASSERT (! MPN_OVERLAP_P (dp, n, scratch, mpn_invertappr_itch(n)));
44 invert_limb (*ip, *dp);
61 mpn_com (xp + n, dp, n);
63 mpn_divrem_2 (ip, 0, xp, 4, dp);
66 invert_pi1 (inv, dp[n-1], dp[n-2]);
68 mpn_sbpi1_div_q (ip, xp, 2 * n, dp,
[all...]
/haiku-buildtools/gcc/gcc/testsuite/g++.old-deja/g++.jason/
H A Dconversion.C13 void bar (DPtr& dp) argument
15 foo (dp);
/haiku-buildtools/gcc/gcc/testsuite/gfortran.dg/lto/
H A Dpr41069_2.f902 INTEGER, PARAMETER :: dp = SELECTED_REAL_KIND ( 14, 200 ) local in subroutine:fftsg3d
4 COMPLEX(KIND=dp), DIMENSION(*), INTENT(INOUT) :: zout

Completed in 210 milliseconds

12345678910