Line data Source code
1 : !--------------------------------------------------------------------------------------------------!
2 : ! CP2K: A general program to perform molecular dynamics simulations !
3 : ! Copyright 2000-2024 CP2K developers group <https://cp2k.org> !
4 : ! !
5 : ! SPDX-License-Identifier: GPL-2.0-or-later !
6 : !--------------------------------------------------------------------------------------------------!
7 :
8 : ! **************************************************************************************************
9 : !> \par History
10 : !> none
11 : !> \author MI (08.01.2004)
12 : ! **************************************************************************************************
13 : MODULE soft_basis_set
14 :
15 : USE ao_util, ONLY: exp_radius
16 : USE basis_set_types, ONLY: copy_gto_basis_set,&
17 : deallocate_gto_basis_set,&
18 : get_gto_basis_set,&
19 : gto_basis_set_type,&
20 : init_cphi_and_sphi
21 : USE kinds, ONLY: default_string_length,&
22 : dp
23 : USE memory_utilities, ONLY: reallocate
24 : USE orbital_pointers, ONLY: indco,&
25 : nco,&
26 : ncoset,&
27 : nso
28 : USE orbital_symbols, ONLY: cgf_symbol,&
29 : sgf_symbol
30 : #include "../base/base_uses.f90"
31 :
32 : IMPLICIT NONE
33 :
34 : PRIVATE
35 :
36 : ! *** Global parameters (only in this module)
37 :
38 : CHARACTER(len=*), PARAMETER, PRIVATE :: moduleN = 'soft_basis_set'
39 :
40 : INTEGER, PARAMETER :: max_name_length = 60
41 :
42 : ! *** Public subroutines ***
43 :
44 : PUBLIC :: create_soft_basis
45 :
46 : CONTAINS
47 :
48 : ! **************************************************************************************************
49 : !> \brief create the soft basis from a GTO basis
50 : !> \param orb_basis ...
51 : !> \param soft_basis ...
52 : !> \param eps_fit ...
53 : !> \param rc ...
54 : !> \param paw_atom ...
55 : !> \param paw_type_forced ...
56 : !> \param gpw_r3d_rs_type_forced ...
57 : !> \version 1.0
58 : ! **************************************************************************************************
59 1928 : SUBROUTINE create_soft_basis(orb_basis, soft_basis, eps_fit, rc, paw_atom, &
60 : paw_type_forced, gpw_r3d_rs_type_forced)
61 :
62 : TYPE(gto_basis_set_type), POINTER :: orb_basis, soft_basis
63 : REAL(dp), INTENT(IN) :: eps_fit, rc
64 : LOGICAL, INTENT(OUT) :: paw_atom
65 : LOGICAL, INTENT(IN) :: paw_type_forced, gpw_r3d_rs_type_forced
66 :
67 : CHARACTER(LEN=default_string_length) :: bsname
68 : INTEGER :: ico, ipgf, ipgf_s, iset, iset_s, ishell, lshell, lshell_old, m, maxco, maxpgf, &
69 : maxpgf_s, maxshell, maxshell_s, ncgf, nset, nset_s, nsgf
70 1928 : INTEGER, ALLOCATABLE, DIMENSION(:) :: iset_s2h
71 1928 : INTEGER, DIMENSION(:), POINTER :: lmax, lmin, npgf, nshell
72 1928 : INTEGER, DIMENSION(:, :), POINTER :: l, n
73 : LOGICAL :: my_gpw_r3d_rs_type_forced
74 : REAL(KIND=dp) :: minzet, radius
75 1928 : REAL(KIND=dp), DIMENSION(:, :), POINTER :: zet
76 1928 : REAL(KIND=dp), DIMENSION(:, :, :), POINTER :: gcc
77 :
78 1928 : NULLIFY (gcc, l, lmax, lmin, n, npgf, nshell, zet)
79 1928 : paw_atom = .FALSE.
80 1928 : my_gpw_r3d_rs_type_forced = gpw_r3d_rs_type_forced
81 1928 : IF (paw_type_forced) THEN
82 18 : paw_atom = .TRUE.
83 : my_gpw_r3d_rs_type_forced = .FALSE.
84 : END IF
85 1910 : IF (.NOT. my_gpw_r3d_rs_type_forced) THEN
86 : CALL get_gto_basis_set(gto_basis_set=orb_basis, name=bsname, &
87 1900 : maxpgf=maxpgf, maxshell=maxshell, nset=nset)
88 :
89 1900 : soft_basis%name = TRIM(bsname)//"_soft"
90 :
91 1900 : CALL reallocate(npgf, 1, nset)
92 1900 : CALL reallocate(nshell, 1, nset)
93 1900 : CALL reallocate(lmax, 1, nset)
94 1900 : CALL reallocate(lmin, 1, nset)
95 :
96 1900 : CALL reallocate(n, 1, maxshell, 1, nset)
97 1900 : CALL reallocate(l, 1, maxshell, 1, nset)
98 :
99 1900 : CALL reallocate(zet, 1, maxpgf, 1, nset)
100 1900 : CALL reallocate(gcc, 1, maxpgf, 1, maxshell, 1, nset)
101 :
102 5700 : ALLOCATE (iset_s2h(nset))
103 :
104 7406 : iset_s2h = 0
105 1900 : iset_s = 0
106 1900 : maxpgf_s = 0
107 1900 : maxshell_s = 0
108 :
109 7406 : DO iset = 1, nset ! iset
110 5506 : minzet = orb_basis%zet(orb_basis%npgf(iset), iset)
111 13320 : DO ipgf = orb_basis%npgf(iset) - 1, 1, -1
112 13320 : IF (orb_basis%zet(ipgf, iset) < minzet) THEN
113 42 : minzet = orb_basis%zet(ipgf, iset)
114 : END IF
115 : END DO
116 5506 : radius = exp_radius(orb_basis%lmax(iset), minzet, eps_fit, 1.0_dp)
117 :
118 : ! The soft basis contains this set
119 5506 : iset_s = iset_s + 1
120 5506 : nshell(iset_s) = orb_basis%nshell(iset)
121 5506 : lmax(iset_s) = orb_basis%lmax(iset)
122 5506 : lmin(iset_s) = orb_basis%lmin(iset)
123 :
124 5506 : iset_s2h(iset_s) = iset
125 :
126 14394 : DO ishell = 1, nshell(iset_s)
127 8888 : n(ishell, iset_s) = orb_basis%n(ishell, iset)
128 14394 : l(ishell, iset_s) = orb_basis%l(ishell, iset)
129 : END DO
130 :
131 5506 : IF (nshell(iset_s) > maxshell_s) THEN
132 2336 : maxshell_s = nshell(iset_s)
133 : END IF
134 :
135 5506 : IF (radius < rc) THEN
136 : ! The soft basis does not contain this set
137 : ! For the moment I keep the set as a dummy set
138 : ! with no exponents, in order to have the right number of contractions
139 : ! In a second time it can be taken away, by creating a pointer
140 : ! which connects the remaining sets to the right contraction index
141 484 : paw_atom = .TRUE.
142 484 : npgf(iset_s) = 0
143 484 : CYCLE
144 : END IF
145 :
146 5022 : ipgf_s = 0
147 16284 : DO ipgf = 1, orb_basis%npgf(iset) ! ipgf
148 11262 : IF (orb_basis%zet(ipgf, iset) > 100.0_dp) THEN
149 : ! The soft basis does not contain this exponent
150 678 : paw_atom = .TRUE.
151 678 : CYCLE
152 : END IF
153 :
154 : radius = exp_radius(orb_basis%lmax(iset), orb_basis%zet(ipgf, iset), &
155 10584 : eps_fit, 1.0_dp)
156 10584 : IF (radius < rc) THEN
157 : ! The soft basis does not contain this exponent
158 2264 : paw_atom = .TRUE.
159 2264 : CYCLE
160 : END IF
161 :
162 : ! The soft basis contains this exponent
163 8320 : ipgf_s = ipgf_s + 1
164 8320 : zet(ipgf_s, iset_s) = orb_basis%zet(ipgf, iset)
165 :
166 8320 : lshell_old = orb_basis%l(1, iset)
167 8320 : radius = exp_radius(lshell_old, zet(ipgf_s, iset_s), eps_fit, 1.0_dp)
168 :
169 31442 : DO ishell = 1, nshell(iset_s)
170 18100 : lshell = orb_basis%l(ishell, iset)
171 18100 : IF (lshell == lshell_old) THEN
172 : ELSE
173 3342 : lshell_old = lshell
174 3342 : radius = exp_radius(lshell_old, zet(ipgf_s, iset_s), eps_fit, 1.0_dp)
175 : END IF
176 26420 : IF (radius < rc) THEN
177 4 : gcc(ipgf_s, ishell, iset_s) = 0.0_dp
178 4 : paw_atom = .TRUE.
179 : ELSE
180 18096 : gcc(ipgf_s, ishell, iset_s) = orb_basis%gcc(ipgf, ishell, iset)
181 : END IF
182 : END DO
183 : END DO
184 5022 : npgf(iset_s) = ipgf_s
185 6922 : IF (ipgf_s > maxpgf_s) THEN
186 2128 : maxpgf_s = ipgf_s
187 : END IF
188 : END DO
189 1900 : nset_s = iset_s
190 1900 : IF (paw_atom) THEN
191 1618 : soft_basis%nset = nset_s
192 1618 : CALL reallocate(soft_basis%lmax, 1, nset_s)
193 1618 : CALL reallocate(soft_basis%lmin, 1, nset_s)
194 1618 : CALL reallocate(soft_basis%npgf, 1, nset_s)
195 1618 : CALL reallocate(soft_basis%nshell, 1, nset_s)
196 1618 : CALL reallocate(soft_basis%n, 1, maxshell_s, 1, nset_s)
197 1618 : CALL reallocate(soft_basis%l, 1, maxshell_s, 1, nset_s)
198 1618 : CALL reallocate(soft_basis%zet, 1, maxpgf_s, 1, nset_s)
199 1618 : CALL reallocate(soft_basis%gcc, 1, maxpgf_s, 1, maxshell_s, 1, nset_s)
200 :
201 : ! *** Copy the basis set information into the data structure ***
202 :
203 6648 : DO iset = 1, nset_s
204 5030 : soft_basis%lmax(iset) = lmax(iset)
205 5030 : soft_basis%lmin(iset) = lmin(iset)
206 5030 : soft_basis%npgf(iset) = npgf(iset)
207 5030 : soft_basis%nshell(iset) = nshell(iset)
208 13004 : DO ishell = 1, nshell(iset)
209 7974 : soft_basis%n(ishell, iset) = n(ishell, iset)
210 7974 : soft_basis%l(ishell, iset) = l(ishell, iset)
211 28534 : DO ipgf = 1, npgf(iset)
212 23504 : soft_basis%gcc(ipgf, ishell, iset) = gcc(ipgf, ishell, iset)
213 : END DO
214 : END DO
215 13982 : DO ipgf = 1, npgf(iset)
216 12364 : soft_basis%zet(ipgf, iset) = zet(ipgf, iset)
217 : END DO
218 : END DO
219 :
220 : ! *** Initialise the depending soft_basis pointers ***
221 1618 : CALL reallocate(soft_basis%set_radius, 1, nset_s)
222 1618 : CALL reallocate(soft_basis%pgf_radius, 1, maxpgf_s, 1, nset_s)
223 1618 : CALL reallocate(soft_basis%first_cgf, 1, maxshell_s, 1, nset_s)
224 1618 : CALL reallocate(soft_basis%first_sgf, 1, maxshell_s, 1, nset_s)
225 1618 : CALL reallocate(soft_basis%last_cgf, 1, maxshell_s, 1, nset_s)
226 1618 : CALL reallocate(soft_basis%last_sgf, 1, maxshell_s, 1, nset_s)
227 1618 : CALL reallocate(soft_basis%ncgf_set, 1, nset_s)
228 1618 : CALL reallocate(soft_basis%nsgf_set, 1, nset_s)
229 :
230 1618 : maxco = 0
231 1618 : ncgf = 0
232 1618 : nsgf = 0
233 :
234 6648 : DO iset = 1, nset_s
235 5030 : soft_basis%ncgf_set(iset) = 0
236 5030 : soft_basis%nsgf_set(iset) = 0
237 13004 : DO ishell = 1, nshell(iset)
238 7974 : lshell = soft_basis%l(ishell, iset)
239 7974 : soft_basis%first_cgf(ishell, iset) = ncgf + 1
240 7974 : ncgf = ncgf + nco(lshell)
241 7974 : soft_basis%last_cgf(ishell, iset) = ncgf
242 : soft_basis%ncgf_set(iset) = &
243 7974 : soft_basis%ncgf_set(iset) + nco(lshell)
244 7974 : soft_basis%first_sgf(ishell, iset) = nsgf + 1
245 7974 : nsgf = nsgf + nso(lshell)
246 7974 : soft_basis%last_sgf(ishell, iset) = nsgf
247 : soft_basis%nsgf_set(iset) = &
248 13004 : soft_basis%nsgf_set(iset) + nso(lshell)
249 : END DO
250 6648 : maxco = MAX(maxco, npgf(iset)*ncoset(lmax(iset)))
251 : END DO
252 1618 : soft_basis%ncgf = ncgf
253 1618 : soft_basis%nsgf = nsgf
254 :
255 1618 : CALL reallocate(soft_basis%cphi, 1, maxco, 1, ncgf)
256 1618 : CALL reallocate(soft_basis%sphi, 1, maxco, 1, nsgf)
257 1618 : CALL reallocate(soft_basis%scon, 1, maxco, 1, nsgf)
258 1618 : CALL reallocate(soft_basis%lx, 1, ncgf)
259 1618 : CALL reallocate(soft_basis%ly, 1, ncgf)
260 1618 : CALL reallocate(soft_basis%lz, 1, ncgf)
261 1618 : CALL reallocate(soft_basis%m, 1, nsgf)
262 1618 : CALL reallocate(soft_basis%norm_cgf, 1, ncgf)
263 4854 : ALLOCATE (soft_basis%cgf_symbol(ncgf))
264 4854 : ALLOCATE (soft_basis%sgf_symbol(nsgf))
265 :
266 1618 : ncgf = 0
267 1618 : nsgf = 0
268 :
269 6648 : DO iset = 1, nset_s
270 14622 : DO ishell = 1, nshell(iset)
271 7974 : lshell = soft_basis%l(ishell, iset)
272 26822 : DO ico = ncoset(lshell - 1) + 1, ncoset(lshell)
273 18848 : ncgf = ncgf + 1
274 18848 : soft_basis%lx(ncgf) = indco(1, ico)
275 18848 : soft_basis%ly(ncgf) = indco(2, ico)
276 18848 : soft_basis%lz(ncgf) = indco(3, ico)
277 : soft_basis%cgf_symbol(ncgf) = &
278 : cgf_symbol(n(ishell, iset), (/soft_basis%lx(ncgf), &
279 : soft_basis%ly(ncgf), &
280 83366 : soft_basis%lz(ncgf)/))
281 : END DO
282 30678 : DO m = -lshell, lshell
283 17674 : nsgf = nsgf + 1
284 17674 : soft_basis%m(nsgf) = m
285 : soft_basis%sgf_symbol(nsgf) = &
286 25648 : sgf_symbol(n(ishell, iset), lshell, m)
287 : END DO
288 : END DO
289 : END DO
290 :
291 : ! *** Normalization factor of the contracted Gaussians ***
292 1618 : soft_basis%norm_type = orb_basis%norm_type
293 39314 : soft_basis%norm_cgf = orb_basis%norm_cgf
294 : ! *** Initialize the transformation matrices ***
295 1618 : CALL init_cphi_and_sphi(soft_basis)
296 : END IF
297 :
298 3800 : DEALLOCATE (gcc, l, lmax, lmin, n, npgf, nshell, zet, iset_s2h)
299 : END IF
300 :
301 1928 : IF (.NOT. paw_atom) THEN
302 310 : CALL deallocate_gto_basis_set(soft_basis)
303 310 : CALL copy_gto_basis_set(orb_basis, soft_basis)
304 310 : CALL get_gto_basis_set(gto_basis_set=orb_basis, name=bsname)
305 310 : soft_basis%name = TRIM(bsname)//"_soft"
306 : END IF
307 :
308 1928 : END SUBROUTINE create_soft_basis
309 :
310 : END MODULE soft_basis_set
|