Home
last modified time | relevance | path

Searched refs:epsi (Results 1 – 25 of 498) sorted by relevance

12345678910>>...20

/dports/science/berkeleygw/BGW-2.0.0/BSE/
H A Depsdiag.f9062 read(12,*) epsi%nq, epsi%emax, epsi%q0vec(:), epsi%epshead
63 SAFE_ALLOCATE(epsi%eps, (epsi%nq))
64 SAFE_ALLOCATE(epsi%q, (3,epsi%nq))
66 read(12,*) epsi%eps(iq), epsi%q(1:3, iq)
87 write(12,*) epsi%nq, epsi%emax, epsi%q0vec(:), epsi%epshead
423 epsi%nq = epsi%nq + 1
464 epsi%nq = epsi%nq + 1
652 epsi%nq = epsi%nq + 1
688 epsi%nq = epsi%nq + 1
748 SAFE_ALLOCATE(epsi%eps, (epsi%nq))
[all …]
/dports/devel/spark/spark-2.1.1/sql/catalyst/src/test/scala/org/apache/spark/sql/catalyst/util/
H A DQuantileSummariesSuite.scala34 epsi: Double,
36 var summary = new QuantileSummaries(threshold, epsi)
48 epsi: Double,
50 var summary = new QuantileSummaries(threshold, epsi)
76 val s = buildSummary(data, epsi, compression)
84 val s = buildSummary(data, epsi, compression)
108 epsi <- Seq(0.1, 0.0001)
118 val s1 = buildSummary(data1, epsi, compression)
119 val s2 = buildSummary(data2, epsi, compression)
137 val s1 = buildSummary(data11, epsi, compression)
[all …]
/dports/math/octave-forge-stk/stk/inst/core/
H A Dstk_cholcov.m56 epsi = 0; variable
60 epsi = eps; variable
74 epsi = epsi * 10; variable
81 ('Adding a little bit of noise to help chol succeed (epsi = %.2e)', epsi));
87 %!shared Q, K, L, U, epsi
92 %! [U, epsi] = stk_cholcov (K);
94 %!assert (epsi == 0)
100 %!assert (epsi == 0)
104 %! [U, epsi] = stk_cholcov (K);
106 %!assert (epsi > 0)
[all …]
/dports/science/elk/elk-7.2.42/src/
H A Depsinv.f9041 epsi(:,:,:)=0.d0
50 ngrf,epsi)
57 call mpi_allreduce(mpi_in_place,epsi,n,mpi_double_complex,mpi_sum,mpicom, &
61 epsi(:,:,:)=-epsi(:,:,:)
63 epsi(ig,ig,:)=epsi(ig,ig,:)+1.d0
72 call zminv(ngrf,epsi(:,:,iw))
77 if (mp_mpi) call putepsinv(iq,epsi)
H A Dtddftlr.f90121 epsi(i,j,:)=vchi0(i,j,:)
124 epsi(i,i,:)=epsi(i,i,:)+1.d0
139 call zgemm('N','N',nm,nm,nm,zone,vchi0(:,:,iw),nm,a,nm,zzero,epsi(:,:,iw),nm)
142 epsi(i,i,iw)=1.d0+epsi(i,i,iw)
172 eps0(:,:,iw)=epsi(:,:,iw)
186 write(51,'(2G18.10)') dble(wrf(iw)),dble(epsi(i,j,iw))
192 write(51,'(2G18.10)') dble(wrf(iw)),aimag(epsi(i,j,iw))
202 epsm(1:3,1:3,iw)=epsi(1:3,1:3,iw)
/dports/astro/geographiclib/GeographicLib-1.52/matlab/geographiclib/private/
H A DC1f.m1 function C1 = C1f(epsi)
4 % C1 = C1F(epsi) evaluates C_{1,l} using Eq. (18). epsi is a K x 1
19 C1 = zeros(length(epsi), nC1);
20 eps2 = epsi.^2;
21 d = epsi;
27 d = d .* epsi;
H A DC2f.m1 function C2 = C2f(epsi)
4 % C2 = C2F(epsi) evaluates C_{2,l} using Eq. (43). epsi is a K x 1 array
19 C2 = zeros(length(epsi), nC2);
20 eps2 = epsi.^2;
21 d = epsi;
27 d = d .* epsi;
H A DC1pf.m1 function C1p = C1pf(epsi)
4 % C1p = C1PF(epsi) evaluates C'_{1,l} using Eq. (21). epsi is a K x 1
19 C1p = zeros(length(epsi), nC1p);
20 eps2 = epsi.^2;
21 d = epsi;
27 d = d .* epsi;
H A DC4f.m1 function C4 = C4f(epsi, C4x)
4 % C4 = C4F(epsi, C4x) evaluates C_{4,l} in the expansion for the area
5 % (Eq. (65) expressed in terms of n and epsi) using the coefficient
6 % vector C4x. epsi is a K x 1 array. C4x is a 1 x 21 array. C4 is a
10 C4 = zeros(length(epsi), nC4);
15 C4(:, l+1) = mult .* polyval(C4x(o : o + m), epsi);
17 mult = mult .* epsi;
H A DA2m1f.m1 function A2m1 = A2m1f(epsi)
4 % A2m1 = A2M1F(epsi) evaluates A_2 - 1 using Eq. (42). epsi and A2m1 are
13 eps2 = epsi.^2;
15 A2m1 = (t - epsi) ./ (1 + epsi);
H A DA1m1f.m1 function A1m1 = A1m1f(epsi)
4 % A1m1 = A1M1F(epsi) evaluates A_1 - 1 using Eq. (17). epsi and A1m1 are
13 eps2 = epsi.^2;
15 A1m1 = (t + epsi) ./ (1 - epsi);
H A DC3f.m1 function C3 = C3f(epsi, C3x)
4 % C3 = C3F(epsi, C3x) evaluates C_{3,l} using Eq. (25) and the
5 % coefficient vector C3x. epsi is a K x 1 array. C3x is a 1 x 15 array.
9 C3 = zeros(length(epsi), nC3 - 1);
14 mult = mult .* epsi;
15 C3(:, l) = mult .* polyval(C3x(o : o + m), epsi);
H A DA3f.m1 function A3 = A3f(epsi, A3x)
4 % A3 = A3F(epsi, A3x) evaluates A_3 using Eq. (24) and the coefficient
5 % vector A3x. epsi and A3 are K x 1 arrays. A3x is a 1 x 6 array.
7 A3 = polyval(A3x, epsi);
/dports/science/code_saturne/code_saturne-7.1.0/src/cogz/
H A Dpdfpp4.f90292 if (((fp2mp.lt.epsi).and.(yfp2mp.lt.epsi))) then
496 if ((f2-f1).gt.epsi) then
505 if ((fmp-yfmp).lt.epsi) then
510 /(1.d0 - fs(1)))).lt.epsi) then
532 if (((ymax(2)-y2).gt.epsi).and.((y2-ymin(2)).gt.epsi) &
533 .and.((ymax(1)-y1).gt.epsi).and.((y1-ymin(1)).gt.epsi)) &
585 if (((ymax(2)-y2).gt.epsi).and.((y2-ymin(2)).gt.epsi) &
586 .and.((ymax(1)-y1).gt.epsi).and.((y1-ymin(1)).gt.epsi)) &
597 elseif (((ymax(2)-y2).gt.epsi) &
598 .and.((y2-ymin(2)).gt.epsi)) then
[all …]
H A Dpdflwc.f90226 if ( (fp2mp.le.epsi).and.(yfp2mp.le.epsi )) then
355 if ( ( (fp2mp.gt.epsi) .and. (yfp2mp.lt.epsi) ) &
356 .or.( (fp2mp.lt.epsi) .and. (yfp2mp.gt.epsi) ) )then
359 if (fp2mp .lt. epsi) then
390 elseif (yfp2mp .lt. epsi) then
431 elseif ( (fp2mp.gt.epsi) .and. (yfp2mp.gt.epsi) ) then
435 if ( ((yfp2mp / fp2mp) .lt. 1.d0 + epsi) &
436 .and. ((yfp2mp / fp2mp) .gt. 1.d0 - epsi) ) then
489 .lt. 1.d0 + epsi) &
491 .gt. 1.d0 - epsi) ) then
/dports/math/reduce/Reduce-svn5758-src/libraries/crlibm/maple/
H A Dgal.mpl27 gal:=proc(xstart,roundX,f,roundY,epsi,succX,iter)
31 eps := abs(epsi);
58 galDoubleToDouble:=proc(xstart,f,epsi,iter)
60 (g,b) := gal(xstart,nearest,f,nearest,epsi,succDouble,iter);
65 galDoubleToDoubleDouble:=proc(xstart,f,epsi,iter)
67 (g,b) := gal(xstart,nearest,f,nearestDD,epsi,succDouble,iter);
/dports/math/crlibm/crlibm-1.0beta4/maple/
H A Dgal.mpl27 gal:=proc(xstart,roundX,f,roundY,epsi,succX,iter)
31 eps := abs(epsi);
58 galDoubleToDouble:=proc(xstart,f,epsi,iter)
60 (g,b) := gal(xstart,nearest,f,nearest,epsi,succDouble,iter);
65 galDoubleToDoubleDouble:=proc(xstart,f,epsi,iter)
67 (g,b) := gal(xstart,nearest,f,nearestDD,epsi,succDouble,iter);
/dports/science/tinker/tinker/source/
H A Dgradrgd.f32 real*8 epsi(3),tau(3) local
76 epsi(1) = ctheta * cphi
77 epsi(2) = ctheta * sphi
78 epsi(3) = -stheta
109 derivs(6,i) = derivs(6,i) + tau(j)*epsi(j)
/dports/lang/gcc6-aux/gcc-6-20180516/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/lang/gcc12-devel/gcc-12-20211205/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/lang/gcc8/gcc-8.5.0/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/lang/gcc10/gcc-10.3.0/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/devel/riscv64-none-elf-gcc/gcc-8.4.0/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/devel/arm-none-eabi-gcc/gcc-8.4.0/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))
/dports/lang/gcc11-devel/gcc-11-20211009/gcc/testsuite/gfortran.dg/
H A Dvalue_4.f9016 real(4) :: epsi = epsilon (1.0_4) variable
27 c = (abs (a-b) > epsi)
33 c = ((abs (real (a-b)) > epsi).or.(abs (aimag (a-b)) > epsi))

12345678910>>...20