Type | Visibility | Attributes | Name | Initial | |||
---|---|---|---|---|---|---|---|
real(kind=dp), | public, | Pointer | :: | UMatCacheData(:,:,:) | => | null() | |
integer, | public, | Pointer | :: | UMatLabels(:,:) | => | null() | |
integer, | public | :: | nSlots | ||||
integer, | public | :: | nPairs | ||||
integer, | public | :: | nTypes | ||||
integer, | public | :: | nStates | ||||
integer, | private | :: | nBI_umat | ||||
logical, | public | :: | tSmallUMat | ||||
integer, | public | :: | iDumpCacheFlag | ||||
integer, | public | :: | nStatesDump | ||||
logical, | public | :: | tReadInCache | ||||
real(kind=dp), | public, | Pointer | :: | UMat2D(:,:) | => | null() | |
real(kind=dp), | private, | Pointer | :: | UMat3d(:,:,:) | => | null() | |
real(kind=dp), | private, | Pointer | :: | UMat3dExch(:,:,:) | => | null() | |
logical, | public | :: | tUMat2D | ||||
logical, | public | :: | tDeferred_Umat2d | ||||
integer, | private, | DIMENSION(:), POINTER | :: | INVBRR | => | null() | |
integer, | private, | DIMENSION(:), POINTER | :: | INVBRR2 | => | null() | |
integer, | private | :: | NOCC | ||||
logical, | public | :: | FREEZETRANSFER | ||||
integer, | public | :: | nSlotsInit | ||||
integer, | public | :: | nMemInit | ||||
integer, | public | :: | UMatCacheFlag | ||||
logical, | public | :: | gen2CPMDInts | ||||
integer, | public | :: | nHits | ||||
integer, | public | :: | nMisses | ||||
integer, | private | :: | iCacheOvCount | ||||
logical, | public | :: | tTransGTID | ||||
logical, | public | :: | tTransFindx | ||||
integer, | public, | Pointer | :: | TransTable(:) | => | null() | |
integer, | private, | Pointer | :: | InvTransTable(:) | => | null() | |
integer, | public | :: | nAuxBasis | ||||
integer, | public | :: | nBasisPairs | ||||
logical, | public | :: | tDFInts | ||||
real(kind=dp), | public, | Pointer | :: | DFCoeffs(:,:) | => | null() | |
real(kind=dp), | public, | Pointer | :: | DFInts(:,:) | => | null() | |
real(kind=dp), | public, | Pointer | :: | DFFitInts(:,:) | => | null() | |
real(kind=dp), | public, | Pointer | :: | DFInvFitInts(:,:) | => | null() | |
integer, | public | :: | iDFMethod | ||||
integer(kind=TagIntType), | private | :: | tagUMatCacheData | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagUMatLabels | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagOUMatCacheData | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagOUMatLabels | = | 0 | ||
integer(kind=TagIntType), | public | :: | tagUMat2D | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagTransTable | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagInvTransTable | = | 0 | ||
integer(kind=TagIntType), | public | :: | tagDFCoeffs | = | 0 | ||
integer(kind=TagIntType), | public | :: | tagDFInts | = | 0 | ||
integer(kind=TagIntType), | public | :: | tagDFFitInts | = | 0 | ||
integer(kind=TagIntType), | public | :: | tagDFInvFitInts | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagInvBRR | = | 0 | ||
integer(kind=TagIntType), | private | :: | tagInvBRR2 | = | 0 |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | i | |||
integer, | intent(in) | :: | j | |||
integer, | intent(in) | :: | k | |||
integer, | intent(in) | :: | l |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | i | |||
integer, | intent(in) | :: | j | |||
integer, | intent(in) | :: | k | |||
integer, | intent(in) | :: | l |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | I | |||
integer, | intent(in) | :: | J | |||
integer, | intent(in) | :: | K | |||
integer, | intent(in) | :: | L | |||
integer, | intent(in) | :: | nBI |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | I | |||
integer, | intent(in) | :: | J | |||
integer, | intent(in) | :: | K | |||
integer, | intent(in) | :: | L | |||
real(kind=dp), | intent(in) | :: | val |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | gInd |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | spin_orb |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | IDI | ||||
integer | :: | IDJ | ||||
integer | :: | IDK | ||||
integer | :: | IDL | ||||
real(kind=dp) | :: | UMATEL | ||||
integer | :: | ICACHE | ||||
integer | :: | ICACHEI | ||||
integer | :: | A | ||||
integer | :: | B | ||||
integer | :: | ITYPE |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | nBasis |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | i | |||
integer, | intent(in) | :: | j | |||
integer, | intent(in) | :: | k | |||
integer, | intent(in) | :: | l |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | BRR2(NBASIS) | ||||
integer | :: | NBASIS |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | BRR(NBASIS) | ||||
integer | :: | NBASIS |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | nBasis | ||||
integer(kind=int64), | intent(out) | :: | iSize |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | NSTATE | ||||
logical | :: | TSMALL |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
type(BasisFN) | :: | G1(*) | ||||
complex(kind=dp) | :: | HarInt(nStates,nStates) |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | TRANS(NSTATES) |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | OldNew(*) | ||||
integer | :: | nOld | ||||
integer | :: | nNew |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | NEWFLAG |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | VAL | ||||
integer | :: | TAB(A:B) | ||||
integer | :: | A | ||||
integer | :: | B | ||||
integer | :: | LOC | ||||
integer | :: | LOC1 | ||||
integer | :: | LOC2 |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | I | ||||
integer | :: | J | ||||
integer | :: | RET |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | IND | ||||
integer | :: | I | ||||
integer | :: | J |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | OrbTrans(nOld) | ||||
integer | :: | nOld | ||||
integer | :: | nNew |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | OldBasis | ||||
integer | :: | NewBasis | ||||
integer | :: | OrbTrans(OldBasis) | ||||
integer | :: | iSS |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | OrbTrans(nOld) | ||||
integer | :: | nOld | ||||
integer | :: | nNew | ||||
integer | :: | onSlots | ||||
integer | :: | onPairs |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | I | ||||
integer | :: | J | ||||
integer | :: | K | ||||
integer | :: | L | ||||
real(kind=dp) | :: | Z | ||||
integer | :: | CacheInd(nPairs) | ||||
integer(kind=int64) | :: | ZeroedInt | ||||
integer(kind=int64) | :: | NonZeroInt |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | nBasis |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer | :: | B | ||||
real(kind=dp) | :: | UMATEL(0:NTYPES-1) | ||||
integer | :: | ICACHE | ||||
integer | :: | ICACHEI | ||||
integer | :: | iType |