Home
last modified time | relevance | path

Searched refs:NEL (Results 1 – 25 of 1075) sorted by relevance

12345678910>>...43

/dports/biology/mopac/mopac7-1.15/fortran/
H A Dperm.f2 DIMENSION IPERM(MAXMOS,60), IADD(20), NEL(20)
25 10 NEL(I)=1000
27 20 NEL(I)=1
28 DO 50 I12=1-12+NELS,NMOS,NEL(12)
30 DO 50 I11=I12+1,NMOS,NEL(11)
32 DO 50 I10=I11+1,NMOS,NEL(10)
34 DO 50 I9=I10+1,NMOS,NEL(9)
36 DO 50 I8=I9+1,NMOS,NEL(8)
38 DO 50 I7=I8+1,NMOS,NEL(7)
40 DO 50 I6=I7+1,NMOS,NEL(6)
[all …]
/dports/math/slatec/src/
H A Dss2lt.f2 SUBROUTINE SS2LT (N, NELT, IA, JA, A, ISYM, NEL, IEL, JEL, EL) argument
95 INTEGER ISYM, N, NEL, NELT
98 INTEGER IA(NELT), IEL(NEL), JA(NELT), JEL(NEL)
107 NEL = 0
109 JEL(ICOL) = NEL+1
115 NEL = NEL + 1
116 IEL(NEL) = IA(J)
117 EL(NEL) = A(J)
121 JEL(N+1) = NEL+1
127 NEL = NELT
H A Dds2lt.f2 SUBROUTINE DS2LT (N, NELT, IA, JA, A, ISYM, NEL, IEL, JEL, EL) argument
96 INTEGER ISYM, N, NEL, NELT
99 INTEGER IA(NELT), IEL(NEL), JA(NELT), JEL(NEL)
108 NEL = 0
110 JEL(ICOL) = NEL+1
116 NEL = NEL + 1
117 IEL(NEL) = IA(J)
118 EL(NEL) = A(J)
122 JEL(N+1) = NEL+1
128 NEL = NELT
H A Dssics.f159 INTEGER ISYM, IWARN, N, NEL, NELT
162 INTEGER IA(NELT), IEL(NEL), JA(NELT), JEL(NEL)
180 NEL = 1
188 NEL = NEL + 1
189 IEL(IROW) = NEL
190 JEL(NEL) = IROW
191 EL(NEL) = 1
218 NEL = NEL + 1
219 JEL(NEL) = ICOL
220 EL(NEL) = A(J)
[all …]
H A Ddsics.f161 INTEGER ISYM, IWARN, N, NEL, NELT
164 INTEGER IA(NELT), IEL(NEL), JA(NELT), JEL(NEL)
182 NEL = 1
190 NEL = NEL + 1
191 IEL(IROW) = NEL
192 JEL(NEL) = IROW
193 EL(NEL) = 1
220 NEL = NEL + 1
221 JEL(NEL) = ICOL
222 EL(NEL) = A(J)
[all …]
H A Dssli2.f2 SUBROUTINE SSLI2 (N, B, X, NEL, IEL, JEL, EL) argument
106 INTEGER N, NEL
108 REAL B(N), EL(NEL), X(N)
109 INTEGER IEL(NEL), JEL(NEL)
/dports/science/gsmc/gsmc-1.1/
H A Dmain.h28 #define NEL 32 /* Max number of network elements (???) */ macro
83 char ELtype[NEL+1]; /* Network element type: R, L, C, T */
86 float ELval0[NEL+1]; /* Value 0 for network element (R, L, C, lenght of T)
88 float ELval1[NEL+1]; /* Value 0 for network element (z0 of T) [ohm] */
89 float ELval2[NEL+1]; /* Value 0 for network element (atten of T) [dB/m]*/
90 char ELplace[NEL+1]; /* Placement of component: s=series, p=parallel, ...
93 char ELlocked[NEL+1]; /* =1 if element is locked for autotune (i.e. cannot
97 float rerhoIP[NEL+1];
98 float imrhoIP[NEL+1];
/dports/science/qmcpack/qmcpack-3.11.0/src/AFQMC/SlaterDeterminantOperations/
H A Dmixed_density_matrix.hpp69 assert(NEL == B.size(1));
70 assert(NEL == T1.size(0));
156 int NEL = B.size(1);
237 int NEL = B.size(1);
548 int NEL = B.size(1);
826 int NEL = B.size(1);
891 int NEL = B.size(1);
1045 std::vector<decltype(&C[0]({0, NEL}, {0, NEL}))> Ct; in MixedDensityMatrix()
1048 Ct.emplace_back(&C[i]({0, NEL}, {0, NEL})); in MixedDensityMatrix()
1208 getrfBatched(NEL, Garray.data(), NEL, ma::pointer_dispatch(IWORK.origin()), in DensityMatrices()
[all …]
H A DSlaterDetOperations_shared.hpp100 int NEL = B.size(1); in MixedDensityMatrixForWoodbury() local
104 assert(QQ0.size(1) == NEL); in MixedDensityMatrixForWoodbury()
106 set_shm_buffer(comm, NEL * (NEL + Nact + NMO)); in MixedDensityMatrixForWoodbury()
107 assert(SM_TMats->num_elements() >= NEL * (NEL + Nact + NMO)); in MixedDensityMatrixForWoodbury()
109 boost::multi::array_ref<T, 2> TNN(to_address(SM_TMats->origin()), {NEL, NEL}); in MixedDensityMatrixForWoodbury()
143 int NEL = B.size(1); in OverlapForWoodbury() local
146 assert(QQ0.size(1) == NEL); in OverlapForWoodbury()
147 set_shm_buffer(comm, NEL * (Nact + NEL)); in OverlapForWoodbury()
148 assert(SM_TMats->num_elements() >= NEL * (Nact + NEL)); in OverlapForWoodbury()
149 boost::multi::array_ref<T, 2> TNN(to_address(SM_TMats->origin()), {NEL, NEL}); in OverlapForWoodbury()
[all …]
/dports/graphics/xd3d/xd3d-8.3.1/src/trad_nopo/
H A Dmain.f101 NEL = NOP2(5)
110 NEL27 = NEL/8
111 MEMUTIL = MEMUTIL + NUMNP + 36*NEL + 28*NEL27
145 IADOM = IANOD + 8*NEL
146 IAVOIS = IADOM + NEL
147 IANVOI = IAVOIS + 26*NEL
148 IAELM = IANVOI + NEL
156 CALL CHERCHE_VOIS(M(IANOD),M(IAVOIS),M(IANVOI),NEL)
160 & ,M(IANVOI),M(IADOM),NEL,NEL27)
178 & ,M(IASD),INTERFACE,EPS,NCOPNP,M(IA5),NEL)
[all …]
H A Decr_elm3d.f1 SUBROUTINE ECR_ELM3D(IFIL,NEL,NUMSD,NODE,NDS) argument
13 DO 20 I=1,NEL
31 DO 40 I=1,NEL
39 IF (NEL_EFF.NE.NEL) PRINT*,'*** Warning: NEL_EFF =',NEL_EFF,
40 & ' and NEL =',NEL
42 WRITE(IFIL) 1,1,NEL,NDS
43 DO 100 I=1,NEL
/dports/science/cp2k/cp2k-2e995eec7fd208c8a72d9544807bd8b8ba8cd1cc/tests/QS/regtest-bs/
H A Dcu2cl6_m1_clp6cud9.inp52 NEL -1 0
57 NEL -1 -2
69 NEL -1 -2
74 NEL -1 0
85 NEL 2
90 NEL 2
102 NEL 2
107 NEL 0
119 NEL 0
124 NEL 2
/dports/science/cp2k-data/cp2k-7.1.0/tests/QS/regtest-bs/
H A Dcu2cl6_m1_clp6cud9.inp53 NEL -1 0
58 NEL -1 -2
70 NEL -1 -2
75 NEL -1 0
86 NEL 2
91 NEL 2
103 NEL 2
108 NEL 0
120 NEL 0
125 NEL 2
/dports/lang/purescript/purescript-0.14.5/src/Language/PureScript/Sugar/Operators/
H A DCommon.hs12 import qualified Data.List.NonEmpty as NEL
113 opUsages = maybe 0 NEL.length . flip M.lookup chainOpSpans
114 precGrouped :: [NEL.NonEmpty (Qualified (OpName nameType))]
115 precGrouped = NEL.groupWith opPrec . sortOn opPrec $ M.keys chainOpSpans
116 assocGrouped :: [NEL.NonEmpty (NEL.NonEmpty (Qualified (OpName nameType)))]
117 assocGrouped = fmap (NEL.groupWith1 opAssoc . NEL.sortWith opAssoc) precGrouped
118 mixedAssoc :: [NEL.NonEmpty (Qualified (OpName nameType))]
120 nonAssoc :: [NEL.NonEmpty (Qualified (OpName nameType))]
121 …nonAssoc = NEL.filter (\assocGroup -> opAssoc (NEL.head assocGroup) == Infix && sum (fmap opUsages…
138 :: M.Map (Qualified (OpName nameType)) (NEL.NonEmpty SourceSpan)
[all …]
/dports/graphics/xd3d/xd3d-8.3.1/src/d3d/
H A Dmyiso.f30 & ,NF,NEL,NDSEL)
34 & ,NF,NEL,NDSEL)
42 & ,NF,NEL,NDSEL)
46 & ,NF,NEL,NDSEL)
54 & ,NF,NEL,NDSEL)
58 & ,NF,NEL,NDSEL)
143 & ,NF,NEL,NDSEL)
147 & ,NF,NEL,NDSEL)
288 IF (NFF.EQ.NEL) THEN
306 DO I=1,NEL
[all …]
/dports/science/dalton/dalton-66052b3af5ea7225e31178bf9a8b031913c72190/DALTON/sirius/
H A Ddets0.F165 INTEGER STRING(NEL,NSTRIN),STRIN2(NEL,NSTRIN)
275 DO 100 I = 1,NEL
285 CALL IWRTMA(IOCC,1,NEL,1,NEL)
340 DO 10 I = 1,NEL
359 CALL IWRTMA(OCC,1,NEL,1,NEL)
360 CALL IWRTMA(UNOCC,1,NORB-NEL,1,NORB-NEL)
364 KSIGN = (-1)**NEL
365 DO 30 I = 1,NEL
389 IJ = NEL
490 INTEGER STRING(NEL,NSTRIN),STRIN2(NEL,NSTRIN)
[all …]
/dports/www/chromium-legacy/chromium-88.0.4324.182/net/network_error_logging/
H A DREADME.md1 # Network Error Logging (NEL)
3 Network Error Logging (NEL) provides out-of-band reporting of network errors
5 NEL policy that defines the Reporting endpoint(s) on which they wish to receive
9 This directory contains the core implementation of NEL.
15 which handles receiving/processing `NEL:` response headers and
24 The `NetworkErrorLoggingService` finds a NEL policy applicable to the request
25 (previously set by a `NEL` header), and if one exists, potentially queues a
26 NEL report to be uploaded out-of-band to the policy's specified Reporting
30 Received NEL policies are persisted to disk by a `PersistentNelStore`, whose
/dports/www/firefox-esr/firefox-91.8.0/testing/web-platform/tests/network-error-logging/
H A DREADME.md9 Each test case generates a unique `reportID` that is used to distinguish the NEL
22 ## Installing NEL policies
24 NEL reports are only generated if the user agent has received a NEL policy for
29 Most of the test cases will therefore make a request or two to install NEL
31 those policies. It will then assert that NEL reports were or were not created,
35 particular "kind" of NEL policy (e.g., `include_subdomains` set vs unset, no
48 the requests that exercise the NEL implementation. That ensures that we don't
49 have to wade through NEL reports about the infrastructure when verifying the NEL
56 assume that as soon as the Fetch API promise resolves, any NEL reports for the
61 Because NEL policies are stored in a global cache in the user agent, we need to
[all …]
/dports/www/firefox/firefox-99.0/testing/web-platform/tests/network-error-logging/
H A DREADME.md9 Each test case generates a unique `reportID` that is used to distinguish the NEL
22 ## Installing NEL policies
24 NEL reports are only generated if the user agent has received a NEL policy for
29 Most of the test cases will therefore make a request or two to install NEL
31 those policies. It will then assert that NEL reports were or were not created,
35 particular "kind" of NEL policy (e.g., `include_subdomains` set vs unset, no
48 the requests that exercise the NEL implementation. That ensures that we don't
49 have to wade through NEL reports about the infrastructure when verifying the NEL
56 assume that as soon as the Fetch API promise resolves, any NEL reports for the
61 Because NEL policies are stored in a global cache in the user agent, we need to
[all …]
/dports/graphics/xd3d/xd3d-8.3.1/src/qlib/
H A Dlitavoir.f10 & ,NGROUP(*),NTYP(*),NEL(*),NDS(*) local
40 & ,NEL,NDS,NUMSD,IMP,IERR,IPR)
111 NEL(NUMSD) = IWORK(3)
118 NELTOT = NELTOT+NEL(NUMSD)
125 DO I=1,NEL(NUMSD)
149 DO I=1,NEL(NUMSD)
236 NEL(NUMSD) = N3
243 NELTOT = NELTOT+NEL(NUMSD)
260 NELLOC = NEL(NUMSD)-1
263 NELLOC = NEL(NUMSD)
[all …]
H A Decritavoir.f2 & ,NPR,NFPR,PR,NGROUP,NTYP,NEL,NDS,NUMSD argument
10 & ,NGROUP(*),NTYP(*),NEL(*),NDS(*) local
42 NELTOT = NELTOT+NEL(NS)
87 IWORK(3) = NEL(NS)
95 DO I=1,NEL(NS)
117 DO I=1,NEL(NS)
149 & ,NGROUP(*),NTYP(*),NEL(*),NDS(*) local
172 NELTOT = NELTOT+NEL(NS)
193 DO I=1,NEL(NS)
261 IWORK(3) = NEL
[all …]
/dports/mail/thunderbird/thunderbird-91.8.0/testing/web-platform/tests/network-error-logging/
H A DREADME.md9 Each test case generates a unique `reportID` that is used to distinguish the NEL
22 ## Installing NEL policies
24 NEL reports are only generated if the user agent has received a NEL policy for
29 Most of the test cases will therefore make a request or two to install NEL
31 those policies. It will then assert that NEL reports were or were not created,
35 particular "kind" of NEL policy (e.g., `include_subdomains` set vs unset, no
48 the requests that exercise the NEL implementation. That ensures that we don't
49 have to wade through NEL reports about the infrastructure when verifying the NEL
56 assume that as soon as the Fetch API promise resolves, any NEL reports for the
61 Because NEL policies are stored in a global cache in the user agent, we need to
[all …]
/dports/lang/spidermonkey78/firefox-78.9.0/testing/web-platform/tests/network-error-logging/
H A DREADME.md9 Each test case generates a unique `reportID` that is used to distinguish the NEL
22 ## Installing NEL policies
24 NEL reports are only generated if the user agent has received a NEL policy for
29 Most of the test cases will therefore make a request or two to install NEL
31 those policies. It will then assert that NEL reports were or were not created,
35 particular "kind" of NEL policy (e.g., `include_subdomains` set vs unset, no
48 the requests that exercise the NEL implementation. That ensures that we don't
49 have to wade through NEL reports about the infrastructure when verifying the NEL
56 assume that as soon as the Fetch API promise resolves, any NEL reports for the
61 Because NEL policies are stored in a global cache in the user agent, we need to
[all …]
/dports/science/cp2k/cp2k-2e995eec7fd208c8a72d9544807bd8b8ba8cd1cc/tests/QS/regtest-almo-strong/
H A DBNH2-sheet.inp77 ! NEL -1
84 ! NEL -1
96 ! NEL 1
103 ! NEL 1
114 NEL 2
121 NEL 2
132 NEL -1 -1
139 NEL -1 -1
/dports/science/cp2k-data/cp2k-7.1.0/tests/QS/regtest-almo-strong/
H A DBNH2-sheet.inp77 ! NEL -1
84 ! NEL -1
96 ! NEL 1
103 ! NEL 1
114 NEL 2
121 NEL 2
132 NEL -1 -1
139 NEL -1 -1

12345678910>>...43