25#include "./base/base_uses.f90"
31 CHARACTER(len=*),
PARAMETER,
PRIVATE :: moduleN =
'qs_kernel_types'
33 LOGICAL,
PARAMETER,
PRIVATE :: debug_this_module = .false.
35 INTEGER,
PARAMETER,
PRIVATE :: nderivs = 3
36 INTEGER,
PARAMETER,
PRIVATE :: maxspins = 2
54 LOGICAL :: do_exck = .false.
60 INTEGER :: deriv_method_id = -1
62 INTEGER :: rho_smooth_id = -1
65 REAL(kind=
dp) :: alpha = -1.0_dp, beta = -1.0_dp
67 LOGICAL :: deriv2_analytic = .false.
68 LOGICAL :: deriv3_analytic = .false.
73 TYPE(
hfx_type),
DIMENSION(:, :),
POINTER :: x_data => null()
100 IF (
ASSOCIATED(kernel_env))
THEN
101 IF (
ASSOCIATED(kernel_env%xc_rho1_set))
THEN
103 DEALLOCATE (kernel_env%xc_rho1_set)
106 IF (
ASSOCIATED(kernel_env%xc_rho_set))
THEN
108 DEALLOCATE (kernel_env%xc_rho_set)
110 IF (
ASSOCIATED(kernel_env%x_data))
THEN
113 IF (
ASSOCIATED(kernel_env%admm_env))
THEN
116 IF (
ASSOCIATED(kernel_env%admm_control))
THEN
Types and set/get functions for auxiliary density matrix methods.
subroutine, public admm_env_release(admm_env)
releases the ADMM environment, cleans up all types
Defines control structures, which contain the parameters and the settings for the DFT-based calculati...
subroutine, public admm_control_release(admm_control)
...
Types and set/get functions for HFX.
subroutine, public hfx_release(x_data)
This routine deallocates all data structures
Defines the basic variable types.
integer, parameter, public dp
contains the types and subroutines for dealing with the lri_env lri : local resolution of the identit...
subroutine, public release_kernel_env(kernel_env)
Release kernel environment.
Simplified Tamm Dancoff approach (sTDA).
represent a group ofunctional derivatives
subroutine, public xc_dset_release(derivative_set)
releases a derivative set
subroutine, public xc_rho_set_release(rho_set, pw_pool)
releases the given rho_set
stores some data used in wavefunction fitting
stores some data used in construction of Kohn-Sham matrix
Collection of variables required to evaluate adiabatic TDDFPT kernel.
Type to hold environments for the different kernels.
A derivative set contains the different derivatives of a xc-functional in form of a linked list.
contains a flag for each component of xc_rho_set, so that you can use it to tell which components you...
represent a density, with all the representation and data needed to perform a functional evaluation