26#include "./base/base_uses.f90"
30 CHARACTER(len=*),
PARAMETER,
PRIVATE :: moduleN =
'pair_potential_types'
125 REAL(kind=
dp),
DIMENSION(2:15) :: a = 0.0_dp
126 REAL(kind=
dp) :: rcore = 0.0_dp
127 REAL(kind=
dp) :: m = 0.0_dp
128 REAL(kind=
dp) :: b = 0.0_dp
133 REAL(kind=
dp) :: epsilon = 0.0_dp
134 REAL(kind=
dp) :: sigma6 = 0.0_dp
135 REAL(kind=
dp) :: sigma12 = 0.0_dp
140 REAL(kind=
dp) :: a = 0.0_dp
141 REAL(kind=
dp) :: b = 0.0_dp
142 REAL(kind=
dp) :: c = 0.0_dp
143 REAL(kind=
dp) :: d = 0.0_dp
148 REAL(kind=
dp) :: a = 0.0_dp
149 REAL(kind=
dp) :: b = 0.0_dp
150 REAL(kind=
dp) :: c = 0.0_dp
151 REAL(kind=
dp) :: d = 0.0_dp
152 REAL(kind=
dp),
DIMENSION(2) :: bd = 0.0_dp
153 END TYPE ftd_pot_type
156 TYPE williams_pot_type
157 REAL(kind=
dp) :: a = 0.0_dp
158 REAL(kind=
dp) :: b = 0.0_dp
159 REAL(kind=
dp) :: c = 0.0_dp
160 END TYPE williams_pot_type
163 TYPE goodwin_pot_type
164 REAL(kind=
dp) :: vr0 = 0.0_dp
165 REAL(kind=
dp) :: m = 0.0_dp, mc = 0.0_dp
166 REAL(kind=
dp) :: d = 0.0_dp, dc = 0.0_dp
167 END TYPE goodwin_pot_type
171 CHARACTER(LEN=default_path_length) :: eam_file_name =
""
172 INTEGER :: npoints = 0
173 REAL(kind=
dp) :: drar = 0.0_dp, drhoar = 0.0_dp, acutal = 0.0_dp
174 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: rho => null(), phi => null(), frho => null(), rhoval => null(), rval => null()
175 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: rhop => null(), phip => null(), frhop => null()
180 CHARACTER(LEN=default_path_length) :: deepmd_file_name =
'NULL'
181 INTEGER :: atom_deepmd_type = 0
186 CHARACTER(LEN=default_path_length) :: quip_file_name =
""
187 CHARACTER(LEN=1024) :: init_args =
""
188 CHARACTER(LEN=1024) :: calc_args =
""
193 CHARACTER(LEN=default_path_length) :: nequip_file_name =
'NULL', nequip_version =
'NULL', &
194 unit_coords =
'NULL', unit_forces =
'NULL', &
195 unit_energy =
'NULL', unit_cell =
'NULL'
196 CHARACTER(LEN=100),
DIMENSION(:),
ALLOCATABLE :: type_names_torch
197 REAL(kind=
dp) :: rcutsq = 0.0_dp, unit_coords_val = 1.0_dp, &
198 unit_forces_val = 1.0_dp, unit_energy_val = 1.0_dp, &
199 unit_cell_val = 1.0_dp
200 LOGICAL :: do_nequip_sp = .false.
205 CHARACTER(LEN=default_path_length) :: allegro_file_name =
'NULL', unit_cell =
'NULL', &
206 nequip_version =
'NULL', unit_coords =
'NULL', &
207 unit_forces =
'NULL', unit_energy =
'NULL'
209 CHARACTER(LEN=100),
DIMENSION(:),
ALLOCATABLE :: type_names_torch
211 REAL(kind=
dp) :: rcutsq = 0.0_dp, unit_coords_val = 1.0_dp, &
212 unit_forces_val = 1.0_dp, unit_cell_val = 1.0_dp, &
213 unit_energy_val = 1.0_dp
214 LOGICAL :: do_allegro_sp = .false.
218 TYPE buck4ran_pot_type
219 REAL(kind=
dp) :: a = 0.0_dp
220 REAL(kind=
dp) :: b = 0.0_dp
221 REAL(kind=
dp) :: c = 0.0_dp
222 REAL(kind=
dp) :: r1 = 0.0_dp
223 REAL(kind=
dp) :: r2 = 0.0_dp
224 REAL(kind=
dp) :: r3 = 0.0_dp
225 INTEGER :: npoly1 = 0, npoly2 = 0
226 REAL(kind=
dp),
DIMENSION(0:10) :: poly1 = 0.0_dp
227 REAL(kind=
dp),
DIMENSION(0:10) :: poly2 = 0.0_dp
228 END TYPE buck4ran_pot_type
231 TYPE buckmorse_pot_type
232 REAL(kind=
dp) :: f0 = 0.0_dp
233 REAL(kind=
dp) :: a1 = 0.0_dp
234 REAL(kind=
dp) :: a2 = 0.0_dp
235 REAL(kind=
dp) :: b1 = 0.0_dp
236 REAL(kind=
dp) :: b2 = 0.0_dp
237 REAL(kind=
dp) :: c = 0.0_dp
238 REAL(kind=
dp) :: d = 0.0_dp
239 REAL(kind=
dp) :: r0 = 0.0_dp
240 REAL(kind=
dp) :: beta = 0.0_dp
241 END TYPE buckmorse_pot_type
246 CHARACTER(LEN=default_path_length) :: potential =
""
247 CHARACTER(LEN=default_string_length), &
248 POINTER,
DIMENSION(:) :: parameters => null(), units => null()
249 CHARACTER(LEN=default_string_length) :: variables =
""
250 REAL(kind=
dp),
DIMENSION(:),
POINTER :: values => null()
256 REAL(kind=
dp) :: a = 0.0_dp
257 REAL(kind=
dp) :: b = 0.0_dp
258 REAL(kind=
dp) :: lambda1 = 0.0_dp
259 REAL(kind=
dp) :: lambda2 = 0.0_dp
260 REAL(kind=
dp) :: alpha = 0.0_dp
261 REAL(kind=
dp) :: beta = 0.0_dp
262 REAL(kind=
dp) :: n = 0.0_dp
263 REAL(kind=
dp) :: c = 0.0_dp
264 REAL(kind=
dp) :: d = 0.0_dp
265 REAL(kind=
dp) :: h = 0.0_dp
266 REAL(kind=
dp) :: lambda3 = 0.0_dp
267 REAL(kind=
dp) :: bigr = 0.0_dp
268 REAL(kind=
dp) :: bigd = 0.0_dp
269 REAL(kind=
dp) :: rcutsq = 0.0_dp
274 REAL(kind=
dp) :: b = 0.0_dp
275 REAL(kind=
dp) :: d = 0.0_dp
276 REAL(kind=
dp) :: e = 0.0_dp
277 REAL(kind=
dp) :: f = 0.0_dp
278 REAL(kind=
dp) :: beta = 0.0_dp
279 REAL(kind=
dp) :: rcutsq = 0.0_dp
280 LOGICAL :: allow_oh_formation = .false.
281 LOGICAL :: allow_h3o_formation = .false.
282 LOGICAL :: allow_o_formation = .false.
287 CHARACTER(LEN=2) :: met1 =
""
288 CHARACTER(LEN=2) :: met2 =
""
289 REAL(kind=
dp) :: epsilon = 0.0_dp
290 REAL(kind=
dp) :: bxy = 0.0_dp
291 REAL(kind=
dp) :: bz = 0.0_dp
292 REAL(kind=
dp) :: r1 = 0.0_dp
293 REAL(kind=
dp) :: r2 = 0.0_dp
294 REAL(kind=
dp) :: a1 = 0.0_dp
295 REAL(kind=
dp) :: a2 = 0.0_dp
296 REAL(kind=
dp) :: a3 = 0.0_dp
297 REAL(kind=
dp) :: a4 = 0.0_dp
298 REAL(kind=
dp) :: a = 0.0_dp
299 REAL(kind=
dp) :: b = 0.0_dp
300 REAL(kind=
dp) :: c = 0.0_dp
301 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: gcn => null()
302 REAL(kind=
dp),
ALLOCATABLE,
DIMENSION(:, :) :: n_vectors
303 REAL(kind=
dp) :: rcutsq = 0.0_dp
304 LOGICAL :: express = .false.
310 CHARACTER(LEN=2) :: met1 =
""
311 CHARACTER(LEN=2) :: met2 =
""
312 REAL(kind=
dp) :: epsilon1 = 0.0_dp
313 REAL(kind=
dp) :: epsilon2 = 0.0_dp
314 REAL(kind=
dp) :: epsilon3 = 0.0_dp
315 REAL(kind=
dp) :: bxy1 = 0.0_dp
316 REAL(kind=
dp) :: bxy2 = 0.0_dp
317 REAL(kind=
dp) :: bz1 = 0.0_dp
318 REAL(kind=
dp) :: bz2 = 0.0_dp
319 REAL(kind=
dp) :: r1 = 0.0_dp
320 REAL(kind=
dp) :: r2 = 0.0_dp
321 REAL(kind=
dp) :: a11 = 0.0_dp
322 REAL(kind=
dp) :: a12 = 0.0_dp
323 REAL(kind=
dp) :: a13 = 0.0_dp
324 REAL(kind=
dp) :: a21 = 0.0_dp
325 REAL(kind=
dp) :: a22 = 0.0_dp
326 REAL(kind=
dp) :: a23 = 0.0_dp
327 REAL(kind=
dp) :: a31 = 0.0_dp
328 REAL(kind=
dp) :: a32 = 0.0_dp
329 REAL(kind=
dp) :: a33 = 0.0_dp
330 REAL(kind=
dp) :: a41 = 0.0_dp
331 REAL(kind=
dp) :: a42 = 0.0_dp
332 REAL(kind=
dp) :: a43 = 0.0_dp
333 REAL(kind=
dp) :: ao1 = 0.0_dp
334 REAL(kind=
dp) :: ao2 = 0.0_dp
335 REAL(kind=
dp) :: bo1 = 0.0_dp
336 REAL(kind=
dp) :: bo2 = 0.0_dp
337 REAL(kind=
dp) :: c = 0.0_dp
338 REAL(kind=
dp) :: ah1 = 0.0_dp
339 REAL(kind=
dp) :: ah2 = 0.0_dp
340 REAL(kind=
dp) :: bh1 = 0.0_dp
341 REAL(kind=
dp) :: bh2 = 0.0_dp
342 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: gcn => null()
343 REAL(kind=
dp),
ALLOCATABLE,
DIMENSION(:, :) :: n_vectors
344 REAL(kind=
dp) :: rcutsq = 0.0_dp
345 LOGICAL :: express = .false.
351 CHARACTER(LEN=default_path_length) :: tabpot_file_name =
""
352 INTEGER :: npoints = 0, index = 0
353 REAL(kind=
dp) :: dr = 0.0_dp, rcut = 0.0_dp
354 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: r => null(), e => null(), f => null()
360 REAL(kind=
dp) :: rmin = 0.0_dp, rmax = 0.0_dp
362 TYPE(gp_pot_type),
POINTER :: gp => null()
363 TYPE(lj_pot_type),
POINTER :: lj => null()
365 TYPE(williams_pot_type),
POINTER :: willis => null()
366 TYPE(goodwin_pot_type),
POINTER :: goodwin => null()
372 TYPE(buck4ran_pot_type),
POINTER :: buck4r => null()
373 TYPE(buckmorse_pot_type),
POINTER :: buckmo => null()
378 TYPE(ftd_pot_type),
POINTER :: ftd => null()
380 END TYPE pot_set_type
384 REAL(kind=
dp) :: rcutsq = 0.0_dp
385 REAL(kind=
dp) :: e_fac = 0.0_dp
386 REAL(kind=
dp) :: e_fcc = 0.0_dp
387 REAL(kind=
dp) :: e_fcs = 0.0_dp
388 REAL(kind=
dp) :: e_fsc = 0.0_dp
389 REAL(kind=
dp) :: z1 = 0.0_dp
390 REAL(kind=
dp) :: z2 = 0.0_dp
391 REAL(kind=
dp),
DIMENSION(0:5) :: zbl_poly = 0.0_dp
392 REAL(kind=
dp),
DIMENSION(2) :: zbl_rcut = 0.0_dp
393 LOGICAL :: undef = .false., &
396 INTEGER :: shell_type = 0
397 CHARACTER(LEN=default_string_length) :: at1 =
""
398 CHARACTER(LEN=default_string_length) :: at2 =
""
399 INTEGER,
POINTER,
DIMENSION(:) ::
TYPE => null()
400 TYPE(pot_set_type),
POINTER,
DIMENSION(:) :: set => null()
406 TYPE pair_potential_type
408 END TYPE pair_potential_type
412 TYPE(pair_potential_type),
DIMENSION(:),
POINTER :: pot => null()
417 TYPE(pair_potential_type),
DIMENSION(:, :),
POINTER :: pot => null()
431 LOGICAL,
INTENT(OUT) :: compare
439 cpassert(
ASSOCIATED(pot1%type))
440 cpassert(
ASSOCIATED(pot2%type))
441 IF (
SIZE(pot1%type) /=
SIZE(pot2%type))
RETURN
442 IF (any(pot1%type /= pot2%type))
RETURN
445 cpassert(
ASSOCIATED(pot1%set))
446 cpassert(
ASSOCIATED(pot2%set))
447 DO i = 1,
SIZE(pot1%type)
449 SELECT CASE (pot1%type(i))
451 IF ((pot1%set(i)%lj%epsilon == pot2%set(i)%lj%epsilon) .AND. &
452 (pot1%set(i)%lj%sigma6 == pot2%set(i)%lj%sigma6) .AND. &
453 (pot1%set(i)%lj%sigma12 == pot2%set(i)%lj%sigma12)) mycompare = .true.
455 IF ((pot1%set(i)%willis%a == pot2%set(i)%willis%a) .AND. &
456 (pot1%set(i)%willis%b == pot2%set(i)%willis%b) .AND. &
457 (pot1%set(i)%willis%c == pot2%set(i)%willis%c)) mycompare = .true.
459 IF ((pot1%set(i)%goodwin%vr0 == pot2%set(i)%goodwin%vr0) .AND. &
460 (pot1%set(i)%goodwin%m == pot2%set(i)%goodwin%m) .AND. &
461 (pot1%set(i)%goodwin%mc == pot2%set(i)%goodwin%mc) .AND. &
462 (pot1%set(i)%goodwin%d == pot2%set(i)%goodwin%d) .AND. &
463 (pot1%set(i)%goodwin%dc == pot2%set(i)%goodwin%dc)) mycompare = .true.
466 IF (pot1%set(i)%eam%npoints == pot2%set(i)%eam%npoints)
THEN
467 IF ((pot1%set(i)%eam%drar == pot2%set(i)%eam%drar) .AND. &
468 (pot1%set(i)%eam%drhoar == pot2%set(i)%eam%drhoar) .AND. &
469 (pot1%set(i)%eam%acutal == pot2%set(i)%eam%acutal) .AND. &
470 (sum(abs(pot1%set(i)%eam%rho - pot2%set(i)%eam%rho)) == 0.0_dp) .AND. &
471 (sum(abs(pot1%set(i)%eam%phi - pot2%set(i)%eam%phi)) == 0.0_dp) .AND. &
472 (sum(abs(pot1%set(i)%eam%frho - pot2%set(i)%eam%frho)) == 0.0_dp) .AND. &
473 (sum(abs(pot1%set(i)%eam%rhoval - pot2%set(i)%eam%rhoval)) == 0.0_dp) .AND. &
474 (sum(abs(pot1%set(i)%eam%rval - pot2%set(i)%eam%rval)) == 0.0_dp) .AND. &
475 (sum(abs(pot1%set(i)%eam%rhop - pot2%set(i)%eam%rhop)) == 0.0_dp) .AND. &
476 (sum(abs(pot1%set(i)%eam%phip - pot2%set(i)%eam%phip)) == 0.0_dp) .AND. &
477 (sum(abs(pot1%set(i)%eam%frhop - pot2%set(i)%eam%frhop)) == 0.0_dp)) mycompare = .true.
480 IF ((pot1%set(i)%deepmd%deepmd_file_name == pot2%set(i)%deepmd%deepmd_file_name) .AND. &
481 (pot1%set(i)%deepmd%atom_deepmd_type == pot2%set(i)%deepmd%atom_deepmd_type)) mycompare = .true.
483 IF ((pot1%set(i)%quip%quip_file_name == pot2%set(i)%quip%quip_file_name) .AND. &
484 (pot1%set(i)%quip%init_args == pot2%set(i)%quip%init_args) .AND. &
485 (pot1%set(i)%quip%calc_args == pot2%set(i)%quip%calc_args)) mycompare = .true.
487 IF ((pot1%set(i)%nequip%nequip_file_name == pot2%set(i)%nequip%nequip_file_name) .AND. &
488 (pot1%set(i)%nequip%unit_coords == pot2%set(i)%nequip%unit_coords) .AND. &
489 (pot1%set(i)%nequip%unit_forces == pot2%set(i)%nequip%unit_forces) .AND. &
490 (pot1%set(i)%nequip%unit_energy == pot2%set(i)%nequip%unit_energy) .AND. &
491 (pot1%set(i)%nequip%unit_cell == pot2%set(i)%nequip%unit_cell)) mycompare = .true.
493 IF ((pot1%set(i)%allegro%allegro_file_name == pot2%set(i)%allegro%allegro_file_name) .AND. &
494 (pot1%set(i)%allegro%unit_coords == pot2%set(i)%allegro%unit_coords) .AND. &
495 (pot1%set(i)%allegro%unit_forces == pot2%set(i)%allegro%unit_forces) .AND. &
496 (pot1%set(i)%allegro%unit_energy == pot2%set(i)%allegro%unit_energy) .AND. &
497 (pot1%set(i)%allegro%unit_cell == pot2%set(i)%allegro%unit_cell)) mycompare = .true.
499 IF ((pot1%set(i)%ft%A == pot2%set(i)%ft%A) .AND. &
500 (pot1%set(i)%ft%B == pot2%set(i)%ft%B) .AND. &
501 (pot1%set(i)%ft%C == pot2%set(i)%ft%C) .AND. &
502 (pot1%set(i)%ft%D == pot2%set(i)%ft%D)) mycompare = .true.
504 IF ((pot1%set(i)%ftd%A == pot2%set(i)%ftd%A) .AND. &
505 (pot1%set(i)%ftd%B == pot2%set(i)%ftd%B) .AND. &
506 (pot1%set(i)%ftd%C == pot2%set(i)%ftd%C) .AND. &
507 (pot1%set(i)%ftd%D == pot2%set(i)%ftd%D) .AND. &
508 (all(pot1%set(i)%ftd%BD(:) == pot2%set(i)%ftd%BD(:)))) mycompare = .true.
510 IF ((sum(abs(pot1%set(i)%ipbv%a - pot2%set(i)%ipbv%a)) == 0.0_dp) .AND. &
511 (pot1%set(i)%ipbv%rcore == pot2%set(i)%ipbv%rcore) .AND. &
512 (pot1%set(i)%ipbv%m == pot2%set(i)%ipbv%m) .AND. &
513 (pot1%set(i)%ipbv%b == pot2%set(i)%ipbv%b)) mycompare = .true.
515 IF ((pot1%set(i)%tersoff%A == pot2%set(i)%tersoff%A) .AND. &
516 (pot1%set(i)%tersoff%B == pot2%set(i)%tersoff%B) .AND. &
517 (pot1%set(i)%tersoff%lambda1 == pot2%set(i)%tersoff%lambda1) .AND. &
518 (pot1%set(i)%tersoff%lambda2 == pot2%set(i)%tersoff%lambda2) .AND. &
519 (pot1%set(i)%tersoff%alpha == pot2%set(i)%tersoff%alpha) .AND. &
520 (pot1%set(i)%tersoff%beta == pot2%set(i)%tersoff%beta) .AND. &
521 (pot1%set(i)%tersoff%n == pot2%set(i)%tersoff%n) .AND. &
522 (pot1%set(i)%tersoff%c == pot2%set(i)%tersoff%c) .AND. &
523 (pot1%set(i)%tersoff%d == pot2%set(i)%tersoff%d) .AND. &
524 (pot1%set(i)%tersoff%h == pot2%set(i)%tersoff%h) .AND. &
525 (pot1%set(i)%tersoff%lambda3 == pot2%set(i)%tersoff%lambda3) .AND. &
526 (pot1%set(i)%tersoff%rcutsq == pot2%set(i)%tersoff%rcutsq) .AND. &
527 (pot1%set(i)%tersoff%bigR == pot2%set(i)%tersoff%bigR) .AND. &
528 (pot1%set(i)%tersoff%bigD == pot2%set(i)%tersoff%bigD)) mycompare = .true.
530 IF ((pot1%set(i)%siepmann%B == pot2%set(i)%siepmann%B) .AND. &
531 (pot1%set(i)%siepmann%D == pot2%set(i)%siepmann%D) .AND. &
532 (pot1%set(i)%siepmann%E == pot2%set(i)%siepmann%E) .AND. &
533 (pot1%set(i)%siepmann%F == pot2%set(i)%siepmann%F) .AND. &
534 (pot1%set(i)%siepmann%beta == pot2%set(i)%siepmann%beta) .AND. &
535 (pot1%set(i)%siepmann%rcutsq == pot2%set(i)%siepmann%rcutsq) .AND. &
536 (pot1%set(i)%siepmann%allow_oh_formation .EQV. &
537 pot2%set(i)%siepmann%allow_oh_formation) .AND. &
538 (pot1%set(i)%siepmann%allow_o_formation .EQV. &
539 pot2%set(i)%siepmann%allow_o_formation) .AND. &
540 (pot1%set(i)%siepmann%allow_h3o_formation .EQV. &
541 pot2%set(i)%siepmann%allow_h3o_formation)) mycompare = .true.
543 IF ((pot1%set(i)%gal%epsilon == pot2%set(i)%gal%epsilon) .AND. &
544 (pot1%set(i)%gal%bxy == pot2%set(i)%gal%bxy) .AND. &
545 (pot1%set(i)%gal%bz == pot2%set(i)%gal%bz) .AND. &
546 (pot1%set(i)%gal%r1 == pot2%set(i)%gal%r1) .AND. &
547 (pot1%set(i)%gal%r2 == pot2%set(i)%gal%r2) .AND. &
548 (pot1%set(i)%gal%a1 == pot2%set(i)%gal%a1) .AND. &
549 (pot1%set(i)%gal%a2 == pot2%set(i)%gal%a2) .AND. &
550 (pot1%set(i)%gal%a3 == pot2%set(i)%gal%a3) .AND. &
551 (pot1%set(i)%gal%a4 == pot2%set(i)%gal%a4) .AND. &
552 (pot1%set(i)%gal%a == pot2%set(i)%gal%a) .AND. &
553 (pot1%set(i)%gal%b == pot2%set(i)%gal%b) .AND. &
554 (pot1%set(i)%gal%c == pot2%set(i)%gal%c) .AND. &
555 (pot1%set(i)%gal%express .EQV. &
556 pot2%set(i)%gal%express) .AND. &
557 (pot1%set(i)%gal%rcutsq == pot2%set(i)%gal%rcutsq)) mycompare = .true.
559 IF ((pot1%set(i)%gal21%epsilon1 == pot2%set(i)%gal21%epsilon1) .AND. &
560 (pot1%set(i)%gal21%epsilon2 == pot2%set(i)%gal21%epsilon2) .AND. &
561 (pot1%set(i)%gal21%epsilon3 == pot2%set(i)%gal21%epsilon3) .AND. &
562 (pot1%set(i)%gal21%bxy1 == pot2%set(i)%gal21%bxy1) .AND. &
563 (pot1%set(i)%gal21%bxy2 == pot2%set(i)%gal21%bxy1) .AND. &
564 (pot1%set(i)%gal21%bz1 == pot2%set(i)%gal21%bz1) .AND. &
565 (pot1%set(i)%gal21%bz2 == pot2%set(i)%gal21%bz2) .AND. &
566 (pot1%set(i)%gal21%r1 == pot2%set(i)%gal21%r1) .AND. &
567 (pot1%set(i)%gal21%r2 == pot2%set(i)%gal21%r2) .AND. &
568 (pot1%set(i)%gal21%a11 == pot2%set(i)%gal21%a11) .AND. &
569 (pot1%set(i)%gal21%a12 == pot2%set(i)%gal21%a12) .AND. &
570 (pot1%set(i)%gal21%a13 == pot2%set(i)%gal21%a13) .AND. &
571 (pot1%set(i)%gal21%a21 == pot2%set(i)%gal21%a21) .AND. &
572 (pot1%set(i)%gal21%a22 == pot2%set(i)%gal21%a22) .AND. &
573 (pot1%set(i)%gal21%a23 == pot2%set(i)%gal21%a23) .AND. &
574 (pot1%set(i)%gal21%a31 == pot2%set(i)%gal21%a31) .AND. &
575 (pot1%set(i)%gal21%a32 == pot2%set(i)%gal21%a32) .AND. &
576 (pot1%set(i)%gal21%a33 == pot2%set(i)%gal21%a33) .AND. &
577 (pot1%set(i)%gal21%a41 == pot2%set(i)%gal21%a41) .AND. &
578 (pot1%set(i)%gal21%a42 == pot2%set(i)%gal21%a42) .AND. &
579 (pot1%set(i)%gal21%a43 == pot2%set(i)%gal21%a43) .AND. &
580 (pot1%set(i)%gal21%AO1 == pot2%set(i)%gal21%AO1) .AND. &
581 (pot1%set(i)%gal21%AO2 == pot2%set(i)%gal21%AO2) .AND. &
582 (pot1%set(i)%gal21%BO1 == pot2%set(i)%gal21%BO1) .AND. &
583 (pot1%set(i)%gal21%BO2 == pot2%set(i)%gal21%BO2) .AND. &
584 (pot1%set(i)%gal21%c == pot2%set(i)%gal21%c) .AND. &
585 (pot1%set(i)%gal21%AH1 == pot2%set(i)%gal21%AH1) .AND. &
586 (pot1%set(i)%gal21%AH2 == pot2%set(i)%gal21%AH2) .AND. &
587 (pot1%set(i)%gal21%BH1 == pot2%set(i)%gal21%BH1) .AND. &
588 (pot1%set(i)%gal21%BH2 == pot2%set(i)%gal21%BH2) .AND. &
589 (pot1%set(i)%gal21%express .EQV. &
590 pot2%set(i)%gal21%express) .AND. &
591 (pot1%set(i)%gal21%rcutsq == pot2%set(i)%gal21%rcutsq)) mycompare = .true.
594 mycompare = mycompare .AND. &
595 (pot1%set(i)%rmin == pot2%set(i)%rmin) .AND. (pot1%set(i)%rmax == pot2%set(i)%rmax)
596 IF ((mycompare) .AND. (i == 1)) compare = .true.
597 compare = compare .AND. mycompare
608 SUBROUTINE pair_potential_single_create(potparm, nset)
610 INTEGER,
INTENT(IN),
OPTIONAL :: nset
614 cpassert(.NOT.
ASSOCIATED(potparm))
617 IF (
PRESENT(nset)) lnset = nset
619 ALLOCATE (potparm%type(lnset))
620 ALLOCATE (potparm%set(lnset))
621 NULLIFY (potparm%spl_f, &
622 potparm%pair_spline_data)
626 NULLIFY (potparm%set(i)%ipbv, &
630 potparm%set(i)%willis, &
631 potparm%set(i)%goodwin, &
632 potparm%set(i)%eam, &
633 potparm%set(i)%quip, &
634 potparm%set(i)%nequip, &
635 potparm%set(i)%allegro, &
636 potparm%set(i)%deepmd, &
637 potparm%set(i)%buck4r, &
638 potparm%set(i)%buckmo, &
639 potparm%set(i)%tersoff, &
640 potparm%set(i)%siepmann, &
641 potparm%set(i)%gal, &
642 potparm%set(i)%gal21, &
643 potparm%set(i)%ftd, &
647 END SUBROUTINE pair_potential_single_create
661 potparm%undef = .true.
662 potparm%no_pp = .false.
663 potparm%no_mb = .false.
666 potparm%rcutsq = 0.0_dp
667 IF (
ASSOCIATED(potparm%pair_spline_data)) &
669 IF (
ASSOCIATED(potparm%spl_f)) &
672 DO i = 1,
SIZE(potparm%type)
675 CALL pair_potential_lj_clean(potparm%set(i)%lj)
676 CALL pair_potential_williams_clean(potparm%set(i)%willis)
677 CALL pair_potential_goodwin_clean(potparm%set(i)%goodwin)
678 CALL pair_potential_eam_clean(potparm%set(i)%eam)
679 CALL pair_potential_quip_clean(potparm%set(i)%quip)
680 CALL pair_potential_nequip_clean(potparm%set(i)%nequip)
681 CALL pair_potential_allegro_clean(potparm%set(i)%allegro)
682 CALL pair_potential_deepmd_clean(potparm%set(i)%deepmd)
683 CALL pair_potential_buck4r_clean(potparm%set(i)%buck4r)
684 CALL pair_potential_buckmo_clean(potparm%set(i)%buckmo)
685 CALL pair_potential_bmhft_clean(potparm%set(i)%ft)
686 CALL pair_potential_bmhftd_clean(potparm%set(i)%ftd)
687 CALL pair_potential_ipbv_clean(potparm%set(i)%ipbv)
688 CALL pair_potential_gp_clean(potparm%set(i)%gp)
689 CALL pair_potential_tersoff_clean(potparm%set(i)%tersoff)
690 CALL pair_potential_siepmann_clean(potparm%set(i)%siepmann)
691 CALL pair_potential_gal_clean(potparm%set(i)%gal)
692 CALL pair_potential_gal21_clean(potparm%set(i)%gal21)
693 CALL pair_potential_tab_clean(potparm%set(i)%tab)
708 cpassert(
ASSOCIATED(potparm_source))
709 IF (.NOT.
ASSOCIATED(potparm_dest))
THEN
710 CALL pair_potential_single_create(potparm_dest,
SIZE(potparm_source%type))
714 potparm_dest%type = potparm_source%type
715 potparm_dest%shell_type = potparm_source%shell_type
716 potparm_dest%undef = potparm_source%undef
717 potparm_dest%no_mb = potparm_source%no_mb
718 potparm_dest%no_pp = potparm_source%no_pp
719 potparm_dest%at1 = potparm_source%at1
720 potparm_dest%at2 = potparm_source%at2
721 potparm_dest%rcutsq = potparm_source%rcutsq
722 IF (
ASSOCIATED(potparm_source%pair_spline_data))
THEN
723 CALL spline_data_p_copy(potparm_source%pair_spline_data, potparm_dest%pair_spline_data)
726 IF (
ASSOCIATED(potparm_source%spl_f))
THEN
730 DO i = 1,
SIZE(potparm_source%type)
731 potparm_dest%set(i)%rmin = potparm_source%set(i)%rmin
732 potparm_dest%set(i)%rmax = potparm_source%set(i)%rmax
733 CALL pair_potential_lj_copy(potparm_source%set(i)%lj, potparm_dest%set(i)%lj)
734 CALL pair_potential_williams_copy(potparm_source%set(i)%willis, potparm_dest%set(i)%willis)
735 CALL pair_potential_goodwin_copy(potparm_source%set(i)%goodwin, potparm_dest%set(i)%goodwin)
736 CALL pair_potential_eam_copy(potparm_source%set(i)%eam, potparm_dest%set(i)%eam)
737 CALL pair_potential_quip_copy(potparm_source%set(i)%quip, potparm_dest%set(i)%quip)
738 CALL pair_potential_nequip_copy(potparm_source%set(i)%nequip, potparm_dest%set(i)%nequip)
739 CALL pair_potential_allegro_copy(potparm_source%set(i)%allegro, potparm_dest%set(i)%allegro)
740 CALL pair_potential_deepmd_copy(potparm_source%set(i)%deepmd, potparm_dest%set(i)%deepmd)
741 CALL pair_potential_bmhft_copy(potparm_source%set(i)%ft, potparm_dest%set(i)%ft)
742 CALL pair_potential_bmhftd_copy(potparm_source%set(i)%ftd, potparm_dest%set(i)%ftd)
743 CALL pair_potential_ipbv_copy(potparm_source%set(i)%ipbv, potparm_dest%set(i)%ipbv)
744 CALL pair_potential_buck4r_copy(potparm_source%set(i)%buck4r, potparm_dest%set(i)%buck4r)
745 CALL pair_potential_buckmo_copy(potparm_source%set(i)%buckmo, potparm_dest%set(i)%buckmo)
746 CALL pair_potential_gp_copy(potparm_source%set(i)%gp, potparm_dest%set(i)%gp)
747 CALL pair_potential_tersoff_copy(potparm_source%set(i)%tersoff, potparm_dest%set(i)%tersoff)
748 CALL pair_potential_siepmann_copy(potparm_source%set(i)%siepmann, potparm_dest%set(i)%siepmann)
749 CALL pair_potential_gal_copy(potparm_source%set(i)%gal, potparm_dest%set(i)%gal)
750 CALL pair_potential_gal21_copy(potparm_source%set(i)%gal21, potparm_dest%set(i)%gal21)
751 CALL pair_potential_tab_copy(potparm_source%set(i)%tab, potparm_dest%set(i)%tab)
765 INTEGER :: i, j, size_dest, size_source
766 LOGICAL :: allocate_new, check
769 cpassert(
ASSOCIATED(potparm_source))
772 check = (.NOT.
ASSOCIATED(potparm_source%pair_spline_data)) .AND. &
773 (.NOT.
ASSOCIATED(potparm_source%spl_f))
775 check = (.NOT.
ASSOCIATED(potparm_dest%pair_spline_data)) .AND. &
776 (.NOT.
ASSOCIATED(potparm_dest%spl_f))
779 size_source =
SIZE(potparm_source%type)
780 allocate_new = .NOT.
ASSOCIATED(potparm_dest)
781 IF (.NOT. allocate_new)
THEN
782 size_dest =
SIZE(potparm_dest%type)
783 IF (size_dest == 1)
THEN
784 check = (
ASSOCIATED(potparm_dest%set(1)%lj)) .OR. &
785 (
ASSOCIATED(potparm_dest%set(1)%willis)) .OR. &
786 (
ASSOCIATED(potparm_dest%set(1)%goodwin)) .OR. &
787 (
ASSOCIATED(potparm_dest%set(1)%eam)) .OR. &
788 (
ASSOCIATED(potparm_dest%set(1)%quip)) .OR. &
789 (
ASSOCIATED(potparm_dest%set(1)%nequip)) .OR. &
790 (
ASSOCIATED(potparm_dest%set(1)%allegro)) .OR. &
791 (
ASSOCIATED(potparm_dest%set(1)%deepmd)) .OR. &
792 (
ASSOCIATED(potparm_dest%set(1)%ft)) .OR. &
793 (
ASSOCIATED(potparm_dest%set(1)%ftd)) .OR. &
794 (
ASSOCIATED(potparm_dest%set(1)%ipbv)) .OR. &
795 (
ASSOCIATED(potparm_dest%set(1)%buck4r)) .OR. &
796 (
ASSOCIATED(potparm_dest%set(1)%buckmo)) .OR. &
797 (
ASSOCIATED(potparm_dest%set(1)%gp)) .OR. &
798 (
ASSOCIATED(potparm_dest%set(1)%tersoff)) .OR. &
799 (
ASSOCIATED(potparm_dest%set(1)%siepmann)) .OR. &
800 (
ASSOCIATED(potparm_dest%set(1)%gal)) .OR. &
801 (
ASSOCIATED(potparm_dest%set(1)%gal)) .OR. &
802 (
ASSOCIATED(potparm_dest%set(1)%tab))
803 IF (.NOT. check)
THEN
804 allocate_new = .true.
805 CALL pair_potential_single_release(potparm_dest)
809 IF (allocate_new)
THEN
811 CALL pair_potential_single_create(potparm_dest, size_source)
812 potparm_dest%shell_type = potparm_source%shell_type
813 potparm_dest%undef = potparm_source%undef
814 potparm_dest%no_mb = potparm_source%no_mb
815 potparm_dest%no_pp = potparm_source%no_pp
816 potparm_dest%at1 = potparm_source%at1
817 potparm_dest%at2 = potparm_source%at2
818 potparm_dest%rcutsq = potparm_source%rcutsq
820 size_dest =
SIZE(potparm_dest%type)
821 NULLIFY (potparm_tmp)
823 CALL pair_potential_single_release(potparm_dest)
824 CALL pair_potential_single_create(potparm_dest, size_dest + size_source)
826 potparm_dest%shell_type = potparm_tmp%shell_type
827 potparm_dest%undef = potparm_tmp%undef
828 potparm_dest%no_mb = potparm_tmp%no_mb
829 potparm_dest%no_pp = potparm_tmp%no_pp
830 potparm_dest%at1 = potparm_tmp%at1
831 potparm_dest%at2 = potparm_tmp%at2
832 potparm_dest%rcutsq = potparm_tmp%rcutsq
834 potparm_dest%type(i) = potparm_tmp%type(i)
835 potparm_dest%set(i)%rmin = potparm_tmp%set(i)%rmin
836 potparm_dest%set(i)%rmax = potparm_tmp%set(i)%rmax
837 CALL pair_potential_lj_copy(potparm_tmp%set(i)%lj, potparm_dest%set(i)%lj)
838 CALL pair_potential_williams_copy(potparm_tmp%set(i)%willis, potparm_dest%set(i)%willis)
839 CALL pair_potential_goodwin_copy(potparm_tmp%set(i)%goodwin, potparm_dest%set(i)%goodwin)
840 CALL pair_potential_eam_copy(potparm_tmp%set(i)%eam, potparm_dest%set(i)%eam)
841 CALL pair_potential_quip_copy(potparm_tmp%set(i)%quip, potparm_dest%set(i)%quip)
842 CALL pair_potential_nequip_copy(potparm_tmp%set(i)%nequip, potparm_dest%set(i)%nequip)
843 CALL pair_potential_allegro_copy(potparm_tmp%set(i)%allegro, potparm_dest%set(i)%allegro)
844 CALL pair_potential_deepmd_copy(potparm_tmp%set(i)%deepmd, potparm_dest%set(i)%deepmd)
845 CALL pair_potential_bmhft_copy(potparm_tmp%set(i)%ft, potparm_dest%set(i)%ft)
846 CALL pair_potential_bmhftd_copy(potparm_tmp%set(i)%ftd, potparm_dest%set(i)%ftd)
847 CALL pair_potential_ipbv_copy(potparm_tmp%set(i)%ipbv, potparm_dest%set(i)%ipbv)
848 CALL pair_potential_buck4r_copy(potparm_tmp%set(i)%buck4r, potparm_dest%set(i)%buck4r)
849 CALL pair_potential_buckmo_copy(potparm_tmp%set(i)%buckmo, potparm_dest%set(i)%buckmo)
850 CALL pair_potential_gp_copy(potparm_tmp%set(i)%gp, potparm_dest%set(i)%gp)
851 CALL pair_potential_tersoff_copy(potparm_tmp%set(i)%tersoff, potparm_dest%set(i)%tersoff)
852 CALL pair_potential_siepmann_copy(potparm_tmp%set(i)%siepmann, potparm_dest%set(i)%siepmann)
853 CALL pair_potential_gal_copy(potparm_tmp%set(i)%gal, potparm_dest%set(i)%gal)
854 CALL pair_potential_gal21_copy(potparm_tmp%set(i)%gal21, potparm_dest%set(i)%gal21)
855 CALL pair_potential_tab_copy(potparm_tmp%set(i)%tab, potparm_dest%set(i)%tab)
857 CALL pair_potential_single_release(potparm_tmp)
860 check = (potparm_dest%shell_type == potparm_source%shell_type) .AND. &
861 (potparm_dest%undef .EQV. potparm_source%undef) .AND. &
862 (potparm_dest%no_mb .EQV. potparm_source%no_mb) .AND. &
863 (potparm_dest%no_pp .EQV. potparm_source%no_pp) .AND. &
864 (potparm_dest%at1 == potparm_source%at1) .AND. &
865 (potparm_dest%at2 == potparm_source%at2) .AND. &
866 (potparm_dest%rcutsq == potparm_source%rcutsq)
869 DO i = size_dest + 1, size_dest + size_source
871 potparm_dest%type(i) = potparm_source%type(j)
872 potparm_dest%set(i)%rmin = potparm_source%set(j)%rmin
873 potparm_dest%set(i)%rmax = potparm_source%set(j)%rmax
874 CALL pair_potential_lj_copy(potparm_source%set(j)%lj, potparm_dest%set(i)%lj)
875 CALL pair_potential_williams_copy(potparm_source%set(j)%willis, potparm_dest%set(i)%willis)
876 CALL pair_potential_goodwin_copy(potparm_source%set(j)%goodwin, potparm_dest%set(i)%goodwin)
877 CALL pair_potential_eam_copy(potparm_source%set(j)%eam, potparm_dest%set(i)%eam)
878 CALL pair_potential_quip_copy(potparm_source%set(j)%quip, potparm_dest%set(i)%quip)
879 CALL pair_potential_nequip_copy(potparm_source%set(j)%nequip, potparm_dest%set(i)%nequip)
880 CALL pair_potential_allegro_copy(potparm_source%set(j)%allegro, potparm_dest%set(i)%allegro)
881 CALL pair_potential_deepmd_copy(potparm_source%set(j)%deepmd, potparm_dest%set(i)%deepmd)
882 CALL pair_potential_bmhft_copy(potparm_source%set(j)%ft, potparm_dest%set(i)%ft)
883 CALL pair_potential_bmhftd_copy(potparm_source%set(j)%ftd, potparm_dest%set(i)%ftd)
884 CALL pair_potential_ipbv_copy(potparm_source%set(j)%ipbv, potparm_dest%set(i)%ipbv)
885 CALL pair_potential_buck4r_copy(potparm_source%set(j)%buck4r, potparm_dest%set(i)%buck4r)
886 CALL pair_potential_buckmo_copy(potparm_source%set(j)%buckmo, potparm_dest%set(i)%buckmo)
887 CALL pair_potential_gp_copy(potparm_source%set(j)%gp, potparm_dest%set(i)%gp)
888 CALL pair_potential_tersoff_copy(potparm_source%set(j)%tersoff, potparm_dest%set(i)%tersoff)
889 CALL pair_potential_siepmann_copy(potparm_source%set(j)%siepmann, potparm_dest%set(i)%siepmann)
890 CALL pair_potential_gal_copy(potparm_source%set(j)%gal, potparm_dest%set(i)%gal)
891 CALL pair_potential_gal21_copy(potparm_source%set(j)%gal21, potparm_dest%set(i)%gal21)
892 CALL pair_potential_tab_copy(potparm_source%set(j)%tab, potparm_dest%set(i)%tab)
901 SUBROUTINE pair_potential_single_release(potparm)
906 cpassert(
ASSOCIATED(potparm))
909 DO i = 1,
SIZE(potparm%type)
910 CALL pair_potential_ipbv_release(potparm%set(i)%ipbv)
911 CALL pair_potential_lj_release(potparm%set(i)%lj)
912 CALL pair_potential_bmhft_release(potparm%set(i)%ft)
913 CALL pair_potential_bmhftd_release(potparm%set(i)%ftd)
914 CALL pair_potential_williams_release(potparm%set(i)%willis)
915 CALL pair_potential_goodwin_release(potparm%set(i)%goodwin)
916 CALL pair_potential_eam_release(potparm%set(i)%eam)
917 CALL pair_potential_quip_release(potparm%set(i)%quip)
918 CALL pair_potential_nequip_release(potparm%set(i)%nequip)
919 CALL pair_potential_allegro_release(potparm%set(i)%allegro)
920 CALL pair_potential_deepmd_release(potparm%set(i)%deepmd)
921 CALL pair_potential_buck4r_release(potparm%set(i)%buck4r)
922 CALL pair_potential_buckmo_release(potparm%set(i)%buckmo)
923 CALL pair_potential_gp_release(potparm%set(i)%gp)
924 CALL pair_potential_tersoff_release(potparm%set(i)%tersoff)
925 CALL pair_potential_siepmann_release(potparm%set(i)%siepmann)
926 CALL pair_potential_gal_release(potparm%set(i)%gal)
927 CALL pair_potential_gal21_release(potparm%set(i)%gal21)
928 CALL pair_potential_tab_release(potparm%set(i)%tab)
930 DEALLOCATE (potparm%type)
931 DEALLOCATE (potparm%set)
933 END SUBROUTINE pair_potential_single_release
943 INTEGER,
INTENT(IN) :: nkinds
947 cpassert(.NOT.
ASSOCIATED(potparm))
949 ALLOCATE (potparm%pot(nkinds, nkinds))
952 NULLIFY (potparm%pot(i, j)%pot)
958 CALL pair_potential_single_create(potparm%pot(i, j)%pot)
959 potparm%pot(j, i)%pot => potparm%pot(i, j)%pot
977 IF (
ASSOCIATED(potparm))
THEN
978 IF (
ASSOCIATED(potparm%pot))
THEN
979 DO i = 1,
SIZE(potparm%pot, 1)
980 DO j = i,
SIZE(potparm%pot, 2)
981 CALL pair_potential_single_release(potparm%pot(i, j)%pot)
982 NULLIFY (potparm%pot(j, i)%pot)
985 DEALLOCATE (potparm%pot)
1000 SUBROUTINE pair_potential_p_create(potparm, ndim, ub, lb)
1002 INTEGER,
INTENT(IN),
OPTIONAL :: ndim, ub, lb
1004 INTEGER :: i, loc_lb, loc_ub
1006 cpassert(.NOT.
ASSOCIATED(potparm))
1008 IF (
PRESENT(ndim))
THEN
1011 ALLOCATE (potparm%pot(loc_lb:loc_ub))
1012 IF (
PRESENT(lb) .OR.
PRESENT(ub))
THEN
1015 ELSE IF (
PRESENT(lb) .AND.
PRESENT(ub))
THEN
1018 ALLOCATE (potparm%pot(loc_lb:loc_ub))
1019 IF (
PRESENT(ndim))
THEN
1025 DO i = loc_lb, loc_ub
1026 NULLIFY (potparm%pot(i)%pot)
1027 CALL pair_potential_single_create(potparm%pot(i)%pot)
1029 END SUBROUTINE pair_potential_p_create
1044 IF (
ASSOCIATED(potparm))
THEN
1045 IF (
ASSOCIATED(potparm%pot))
THEN
1046 DO i = 1,
SIZE(potparm%pot)
1047 CALL pair_potential_single_release(potparm%pot(i)%pot)
1049 DEALLOCATE (potparm%pot)
1051 DEALLOCATE (potparm)
1064 SUBROUTINE pair_potential_p_copy(source, dest, istart, iend)
1066 INTEGER,
INTENT(IN),
OPTIONAL :: istart, iend
1068 INTEGER :: i, l_end, l_start
1070 cpassert(
ASSOCIATED(source))
1071 cpassert(
ASSOCIATED(dest))
1072 l_start = lbound(source%pot, 1)
1073 l_end = ubound(source%pot, 1)
1074 IF (
PRESENT(istart)) l_start = istart
1075 IF (
PRESENT(iend)) l_end = iend
1076 DO i = l_start, l_end
1077 IF (.NOT.
ASSOCIATED(source%pot(i)%pot)) &
1078 CALL pair_potential_single_create(source%pot(i)%pot)
1081 END SUBROUTINE pair_potential_p_copy
1111 quip, nequip, allegro, bmhft, bmhftd, ipbv, buck4r, buckmo, &
1112 gp, tersoff, siepmann, gal, gal21, tab, deepmd)
1114 INTEGER,
INTENT(IN) :: lb1_new, ub1_new
1115 LOGICAL,
INTENT(IN),
OPTIONAL :: lj, lj_charmm, williams, goodwin, eam, quip, nequip, &
1116 allegro, bmhft, bmhftd, ipbv, buck4r, buckmo, gp, tersoff, siepmann, gal, gal21, tab, &
1119 INTEGER :: i, ipot, lb1_old, std_dim, ub1_old
1120 LOGICAL :: check, lallegro, lbmhft, lbmhftd, lbuck4r, lbuckmo, ldeepmd, leam, lgal, lgal21, &
1121 lgoodwin, lgp, lipbv, llj, llj_charmm, lnequip, lquip, lsiepmann, ltab, ltersoff, &
1127 llj = .false.;
IF (
PRESENT(lj)) llj = lj
1128 llj_charmm = .false.;
IF (
PRESENT(lj_charmm)) llj_charmm = lj_charmm
1129 lwilliams = .false.;
IF (
PRESENT(williams)) lwilliams = williams
1130 lgoodwin = .false.;
IF (
PRESENT(goodwin)) lgoodwin = goodwin
1131 leam = .false.;
IF (
PRESENT(eam)) leam = eam
1132 lquip = .false.;
IF (
PRESENT(quip)) lquip = quip
1133 lnequip = .false.;
IF (
PRESENT(nequip)) lnequip = nequip
1134 lallegro = .false.;
IF (
PRESENT(allegro)) lallegro = allegro
1135 ldeepmd = .false.;
IF (
PRESENT(deepmd)) ldeepmd = deepmd
1136 lbmhft = .false.;
IF (
PRESENT(bmhft)) lbmhft = bmhft
1137 lbmhftd = .false.;
IF (
PRESENT(bmhftd)) lbmhftd = bmhftd
1138 lipbv = .false.;
IF (
PRESENT(ipbv)) lipbv = ipbv
1139 lbuck4r = .false.;
IF (
PRESENT(buck4r)) lbuck4r = buck4r
1140 lbuckmo = .false.;
IF (
PRESENT(buckmo)) lbuckmo = buckmo
1141 lgp = .false.;
IF (
PRESENT(gp)) lgp = gp
1142 ltersoff = .false.;
IF (
PRESENT(tersoff)) ltersoff = tersoff
1143 lsiepmann = .false.;
IF (
PRESENT(siepmann)) lsiepmann = siepmann
1144 lgal = .false.;
IF (
PRESENT(gal)) lgal = gal
1145 lgal21 = .false.;
IF (
PRESENT(gal21)) lgal21 = gal21
1146 ltab = .false.;
IF (
PRESENT(tab)) ltab = tab
1150 check = .NOT. (llj_charmm .OR. lwilliams .OR. lgoodwin .OR. leam .OR. lquip .OR. lnequip .OR. lallegro &
1151 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1152 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1155 IF (llj_charmm)
THEN
1157 check = .NOT. (llj .OR. lwilliams .OR. lgoodwin .OR. leam .OR. lquip .OR. lnequip .OR. lallegro &
1158 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1159 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1164 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. leam .OR. lquip .OR. lnequip .OR. lallegro &
1165 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1166 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1171 check = .NOT. (llj .OR. llj_charmm .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip .OR. lallegro &
1172 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1173 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1178 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. lquip .OR. lnequip .OR. lallegro &
1179 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1180 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1185 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip .OR. lallegro &
1186 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1187 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1192 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lallegro &
1193 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1194 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1199 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1200 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1201 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1206 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1207 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp &
1208 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab)
1213 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1214 .OR. lallegro .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1215 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1220 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1221 .OR. lallegro .OR. lbmhft .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1222 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1227 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1228 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1229 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1234 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1235 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuckmo .OR. lgp .OR. ltersoff &
1236 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1241 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1242 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. ltersoff &
1243 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1248 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1249 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1250 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1255 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1256 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1257 .OR. ltersoff .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1262 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1263 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1264 .OR. ltersoff .OR. lsiepmann .OR. lgal21 .OR. ltab .OR. ldeepmd)
1269 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1270 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1271 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. ltab .OR. ldeepmd)
1276 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1277 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgal21 .OR. lbuckmo &
1278 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. ltab .OR. ldeepmd)
1283 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lquip .OR. lnequip &
1284 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lgal21 &
1285 .OR. lbuckmo .OR. ltersoff .OR. lsiepmann .OR. lgal)
1291 IF (
ASSOCIATED(p))
THEN
1292 lb1_old = lbound(p%pot, 1)
1293 ub1_old = ubound(p%pot, 1)
1294 CALL pair_potential_p_create(work, lb=lb1_old, ub=ub1_old)
1295 CALL pair_potential_p_copy(p, work)
1299 CALL pair_potential_p_create(p, lb=lb1_new, ub=ub1_new)
1300 IF (
ASSOCIATED(work))
THEN
1301 CALL pair_potential_p_copy(work, p, istart=lb1_old, iend=ub1_old)
1304 DO i = ub1_old + 1, ub1_new
1305 check = (
SIZE(p%pot(i)%pot%type) == std_dim) .AND. (
SIZE(p%pot(i)%pot%type) == std_dim)
1309 p%pot(i)%pot%undef = .true.
1310 p%pot(i)%pot%no_mb = .false.
1311 p%pot(i)%pot%no_pp = .false.
1312 p%pot(i)%pot%at1 =
'NULL'
1313 p%pot(i)%pot%at2 =
'NULL'
1320 CALL pair_potential_williams_create(p%pot(i)%pot%set(std_dim)%willis)
1322 CALL pair_potential_goodwin_create(p%pot(i)%pot%set(std_dim)%goodwin)
1324 CALL pair_potential_eam_create(p%pot(i)%pot%set(std_dim)%eam)
1326 CALL pair_potential_quip_create(p%pot(i)%pot%set(std_dim)%quip)
1328 CALL pair_potential_nequip_create(p%pot(i)%pot%set(std_dim)%nequip)
1330 CALL pair_potential_allegro_create(p%pot(i)%pot%set(std_dim)%allegro)
1332 CALL pair_potential_deepmd_create(p%pot(i)%pot%set(std_dim)%deepmd)
1334 CALL pair_potential_bmhft_create(p%pot(i)%pot%set(std_dim)%ft)
1336 CALL pair_potential_bmhftd_create(p%pot(i)%pot%set(std_dim)%ftd)
1338 CALL pair_potential_ipbv_create(p%pot(i)%pot%set(std_dim)%ipbv)
1340 CALL pair_potential_buck4r_create(p%pot(i)%pot%set(std_dim)%buck4r)
1342 CALL pair_potential_buckmo_create(p%pot(i)%pot%set(std_dim)%buckmo)
1344 CALL pair_potential_gp_create(p%pot(i)%pot%set(std_dim)%gp)
1346 CALL pair_potential_tersoff_create(p%pot(i)%pot%set(std_dim)%tersoff)
1348 CALL pair_potential_siepmann_create(p%pot(i)%pot%set(std_dim)%siepmann)
1350 CALL pair_potential_gal_create(p%pot(i)%pot%set(std_dim)%gal)
1352 CALL pair_potential_gal21_create(p%pot(i)%pot%set(std_dim)%gal21)
1354 CALL pair_potential_tab_create(p%pot(i)%pot%set(std_dim)%tab)
1356 NULLIFY (p%pot(i)%pot%spl_f)
1357 NULLIFY (p%pot(i)%pot%pair_spline_data)
1368 SUBROUTINE pair_potential_gp_create(gp)
1369 TYPE(gp_pot_type),
POINTER :: gp
1371 cpassert(.NOT.
ASSOCIATED(gp))
1373 NULLIFY (gp%parameters)
1375 CALL pair_potential_gp_clean(gp)
1376 END SUBROUTINE pair_potential_gp_create
1384 SUBROUTINE pair_potential_gp_copy(gp_source, gp_dest)
1385 TYPE(gp_pot_type),
POINTER :: gp_source, gp_dest
1389 IF (.NOT.
ASSOCIATED(gp_source))
RETURN
1390 IF (
ASSOCIATED(gp_dest))
CALL pair_potential_gp_release(gp_dest)
1391 CALL pair_potential_gp_create(gp_dest)
1392 gp_dest%myid = gp_source%myid
1393 gp_dest%potential = gp_source%potential
1394 gp_dest%variables = gp_source%variables
1395 IF (
ASSOCIATED(gp_source%parameters))
THEN
1396 idim =
SIZE(gp_source%parameters)
1397 ALLOCATE (gp_dest%parameters(idim))
1398 gp_dest%parameters = gp_source%parameters
1400 IF (
ASSOCIATED(gp_source%values))
THEN
1401 idim =
SIZE(gp_source%values)
1402 ALLOCATE (gp_dest%values(idim))
1403 gp_dest%values = gp_source%values
1405 END SUBROUTINE pair_potential_gp_copy
1412 SUBROUTINE pair_potential_gp_clean(gp)
1413 TYPE(gp_pot_type),
POINTER :: gp
1415 IF (.NOT.
ASSOCIATED(gp))
RETURN
1419 IF (
ASSOCIATED(gp%values))
THEN
1420 DEALLOCATE (gp%values)
1422 IF (
ASSOCIATED(gp%parameters))
THEN
1423 DEALLOCATE (gp%parameters)
1425 END SUBROUTINE pair_potential_gp_clean
1432 SUBROUTINE pair_potential_gp_release(gp)
1433 TYPE(gp_pot_type),
POINTER :: gp
1435 IF (
ASSOCIATED(gp))
THEN
1436 IF (
ASSOCIATED(gp%parameters))
THEN
1437 DEALLOCATE (gp%parameters)
1439 IF (
ASSOCIATED(gp%values))
THEN
1440 DEALLOCATE (gp%values)
1445 END SUBROUTINE pair_potential_gp_release
1453 TYPE(lj_pot_type),
POINTER :: lj
1455 cpassert(.NOT.
ASSOCIATED(lj))
1457 CALL pair_potential_lj_clean(lj)
1466 SUBROUTINE pair_potential_lj_copy(lj_source, lj_dest)
1467 TYPE(lj_pot_type),
POINTER :: lj_source, lj_dest
1469 IF (.NOT.
ASSOCIATED(lj_source))
RETURN
1470 IF (
ASSOCIATED(lj_dest))
CALL pair_potential_lj_release(lj_dest)
1472 lj_dest%epsilon = lj_source%epsilon
1473 lj_dest%sigma6 = lj_source%sigma6
1474 lj_dest%sigma12 = lj_source%sigma12
1475 END SUBROUTINE pair_potential_lj_copy
1482 SUBROUTINE pair_potential_lj_clean(lj)
1483 TYPE(lj_pot_type),
POINTER :: lj
1485 IF (.NOT.
ASSOCIATED(lj))
RETURN
1489 END SUBROUTINE pair_potential_lj_clean
1496 SUBROUTINE pair_potential_lj_release(lj)
1497 TYPE(lj_pot_type),
POINTER :: lj
1499 IF (
ASSOCIATED(lj))
THEN
1503 END SUBROUTINE pair_potential_lj_release
1510 SUBROUTINE pair_potential_williams_create(willis)
1511 TYPE(williams_pot_type),
POINTER :: willis
1513 cpassert(.NOT.
ASSOCIATED(willis))
1515 CALL pair_potential_williams_clean(willis)
1516 END SUBROUTINE pair_potential_williams_create
1524 SUBROUTINE pair_potential_williams_copy(willis_source, willis_dest)
1525 TYPE(williams_pot_type),
POINTER :: willis_source, willis_dest
1527 IF (.NOT.
ASSOCIATED(willis_source))
RETURN
1528 IF (
ASSOCIATED(willis_dest))
CALL pair_potential_williams_release(willis_dest)
1529 CALL pair_potential_williams_create(willis_dest)
1530 willis_dest%a = willis_source%a
1531 willis_dest%b = willis_source%b
1532 willis_dest%c = willis_source%c
1533 END SUBROUTINE pair_potential_williams_copy
1540 SUBROUTINE pair_potential_williams_clean(willis)
1541 TYPE(williams_pot_type),
POINTER :: willis
1543 IF (.NOT.
ASSOCIATED(willis))
RETURN
1547 END SUBROUTINE pair_potential_williams_clean
1554 SUBROUTINE pair_potential_williams_release(willis)
1555 TYPE(williams_pot_type),
POINTER :: willis
1557 IF (
ASSOCIATED(willis))
THEN
1561 END SUBROUTINE pair_potential_williams_release
1568 SUBROUTINE pair_potential_goodwin_create(goodwin)
1569 TYPE(goodwin_pot_type),
POINTER :: goodwin
1571 cpassert(.NOT.
ASSOCIATED(goodwin))
1573 CALL pair_potential_goodwin_clean(goodwin)
1574 END SUBROUTINE pair_potential_goodwin_create
1582 SUBROUTINE pair_potential_goodwin_copy(goodwin_source, goodwin_dest)
1583 TYPE(goodwin_pot_type),
POINTER :: goodwin_source, goodwin_dest
1585 IF (.NOT.
ASSOCIATED(goodwin_source))
RETURN
1586 IF (
ASSOCIATED(goodwin_dest))
CALL pair_potential_goodwin_release(goodwin_dest)
1587 CALL pair_potential_goodwin_create(goodwin_dest)
1588 goodwin_dest%vr0 = goodwin_source%vr0
1589 goodwin_dest%d = goodwin_source%d
1590 goodwin_dest%dc = goodwin_source%dc
1591 goodwin_dest%m = goodwin_source%m
1592 goodwin_dest%mc = goodwin_source%mc
1593 END SUBROUTINE pair_potential_goodwin_copy
1600 SUBROUTINE pair_potential_goodwin_clean(goodwin)
1601 TYPE(goodwin_pot_type),
POINTER :: goodwin
1603 IF (.NOT.
ASSOCIATED(goodwin))
RETURN
1604 goodwin%vr0 = 0.0_dp
1609 END SUBROUTINE pair_potential_goodwin_clean
1616 SUBROUTINE pair_potential_goodwin_release(goodwin)
1617 TYPE(goodwin_pot_type),
POINTER :: goodwin
1619 IF (
ASSOCIATED(goodwin))
THEN
1620 DEALLOCATE (goodwin)
1623 END SUBROUTINE pair_potential_goodwin_release
1630 SUBROUTINE pair_potential_eam_create(eam)
1633 cpassert(.NOT.
ASSOCIATED(eam))
1635 NULLIFY (eam%rho, eam%phi, eam%frho, eam%rhoval, eam%rval, &
1636 eam%rhop, eam%phip, eam%frhop)
1637 CALL pair_potential_eam_clean(eam)
1638 END SUBROUTINE pair_potential_eam_create
1646 SUBROUTINE pair_potential_eam_copy(eam_source, eam_dest)
1649 IF (.NOT.
ASSOCIATED(eam_source))
RETURN
1650 IF (
ASSOCIATED(eam_dest))
CALL pair_potential_eam_release(eam_dest)
1651 CALL pair_potential_eam_create(eam_dest)
1652 eam_dest%eam_file_name = eam_source%eam_file_name
1653 eam_dest%drar = eam_source%drar
1654 eam_dest%drhoar = eam_source%drhoar
1655 eam_dest%acutal = eam_source%acutal
1656 eam_dest%npoints = eam_source%npoints
1658 CALL reallocate(eam_dest%rho, 1, eam_dest%npoints)
1659 CALL reallocate(eam_dest%rhop, 1, eam_dest%npoints)
1660 CALL reallocate(eam_dest%phi, 1, eam_dest%npoints)
1661 CALL reallocate(eam_dest%phip, 1, eam_dest%npoints)
1662 CALL reallocate(eam_dest%frho, 1, eam_dest%npoints)
1663 CALL reallocate(eam_dest%frhop, 1, eam_dest%npoints)
1664 CALL reallocate(eam_dest%rval, 1, eam_dest%npoints)
1665 CALL reallocate(eam_dest%rhoval, 1, eam_dest%npoints)
1666 eam_dest%rho = eam_source%rho
1667 eam_dest%phi = eam_source%phi
1668 eam_dest%frho = eam_source%frho
1669 eam_dest%rhoval = eam_source%rhoval
1670 eam_dest%rval = eam_source%rval
1671 eam_dest%rhop = eam_source%rhop
1672 eam_dest%phip = eam_source%phip
1673 eam_dest%frhop = eam_source%frhop
1674 END SUBROUTINE pair_potential_eam_copy
1681 SUBROUTINE pair_potential_eam_clean(eam)
1684 IF (.NOT.
ASSOCIATED(eam))
RETURN
1685 eam%eam_file_name =
'NULL'
1698 END SUBROUTINE pair_potential_eam_clean
1705 SUBROUTINE pair_potential_eam_release(eam)
1708 IF (
ASSOCIATED(eam))
THEN
1709 IF (
ASSOCIATED(eam%rho))
THEN
1710 DEALLOCATE (eam%rho)
1712 IF (
ASSOCIATED(eam%rhop))
THEN
1713 DEALLOCATE (eam%rhop)
1715 IF (
ASSOCIATED(eam%phi))
THEN
1716 DEALLOCATE (eam%phi)
1718 IF (
ASSOCIATED(eam%phip))
THEN
1719 DEALLOCATE (eam%phip)
1721 IF (
ASSOCIATED(eam%frho))
THEN
1722 DEALLOCATE (eam%frho)
1724 IF (
ASSOCIATED(eam%frhop))
THEN
1725 DEALLOCATE (eam%frhop)
1727 IF (
ASSOCIATED(eam%rval))
THEN
1728 DEALLOCATE (eam%rval)
1730 IF (
ASSOCIATED(eam%rhoval))
THEN
1731 DEALLOCATE (eam%rhoval)
1735 END SUBROUTINE pair_potential_eam_release
1742 SUBROUTINE pair_potential_deepmd_create(deepmd)
1745 cpassert(.NOT.
ASSOCIATED(deepmd))
1747 END SUBROUTINE pair_potential_deepmd_create
1755 SUBROUTINE pair_potential_deepmd_copy(deepmd_source, deepmd_dest)
1758 IF (.NOT.
ASSOCIATED(deepmd_source))
RETURN
1759 NULLIFY (deepmd_dest)
1760 IF (
ASSOCIATED(deepmd_dest))
CALL pair_potential_deepmd_release(deepmd_dest)
1761 CALL pair_potential_deepmd_create(deepmd_dest)
1762 deepmd_dest = deepmd_source
1763 END SUBROUTINE pair_potential_deepmd_copy
1770 SUBROUTINE pair_potential_deepmd_clean(deepmd)
1773 IF (.NOT.
ASSOCIATED(deepmd))
RETURN
1775 END SUBROUTINE pair_potential_deepmd_clean
1782 SUBROUTINE pair_potential_deepmd_release(deepmd)
1785 IF (
ASSOCIATED(deepmd))
THEN
1788 END SUBROUTINE pair_potential_deepmd_release
1795 SUBROUTINE pair_potential_quip_create(quip)
1798 cpassert(.NOT.
ASSOCIATED(quip))
1800 quip%quip_file_name =
""
1803 CALL pair_potential_quip_clean(quip)
1804 END SUBROUTINE pair_potential_quip_create
1812 SUBROUTINE pair_potential_quip_copy(quip_source, quip_dest)
1815 IF (.NOT.
ASSOCIATED(quip_source))
RETURN
1816 IF (
ASSOCIATED(quip_dest))
CALL pair_potential_quip_release(quip_dest)
1817 CALL pair_potential_quip_create(quip_dest)
1818 quip_dest%quip_file_name = quip_source%quip_file_name
1819 quip_dest%init_args = quip_source%init_args
1820 quip_dest%calc_args = quip_source%calc_args
1821 END SUBROUTINE pair_potential_quip_copy
1828 SUBROUTINE pair_potential_quip_clean(quip)
1831 IF (.NOT.
ASSOCIATED(quip))
RETURN
1832 quip%quip_file_name =
'NULL'
1835 END SUBROUTINE pair_potential_quip_clean
1842 SUBROUTINE pair_potential_quip_release(quip)
1845 IF (
ASSOCIATED(quip))
THEN
1848 END SUBROUTINE pair_potential_quip_release
1855 SUBROUTINE pair_potential_nequip_create(nequip)
1858 cpassert(.NOT.
ASSOCIATED(nequip))
1860 END SUBROUTINE pair_potential_nequip_create
1868 SUBROUTINE pair_potential_nequip_copy(nequip_source, nequip_dest)
1871 IF (.NOT.
ASSOCIATED(nequip_source))
RETURN
1872 IF (
ASSOCIATED(nequip_dest))
CALL pair_potential_nequip_release(nequip_dest)
1873 CALL pair_potential_nequip_create(nequip_dest)
1874 nequip_dest = nequip_source
1876 END SUBROUTINE pair_potential_nequip_copy
1883 SUBROUTINE pair_potential_nequip_clean(nequip)
1886 IF (.NOT.
ASSOCIATED(nequip))
RETURN
1889 END SUBROUTINE pair_potential_nequip_clean
1896 SUBROUTINE pair_potential_nequip_release(nequip)
1899 IF (
ASSOCIATED(nequip))
THEN
1902 END SUBROUTINE pair_potential_nequip_release
1909 SUBROUTINE pair_potential_allegro_create(allegro)
1912 cpassert(.NOT.
ASSOCIATED(allegro))
1914 END SUBROUTINE pair_potential_allegro_create
1922 SUBROUTINE pair_potential_allegro_copy(allegro_source, allegro_dest)
1925 IF (.NOT.
ASSOCIATED(allegro_source))
RETURN
1926 IF (
ASSOCIATED(allegro_dest))
CALL pair_potential_allegro_release(allegro_dest)
1927 CALL pair_potential_allegro_create(allegro_dest)
1928 allegro_dest = allegro_source
1929 END SUBROUTINE pair_potential_allegro_copy
1936 SUBROUTINE pair_potential_allegro_clean(allegro)
1939 IF (.NOT.
ASSOCIATED(allegro))
RETURN
1942 END SUBROUTINE pair_potential_allegro_clean
1949 SUBROUTINE pair_potential_allegro_release(allegro)
1952 IF (
ASSOCIATED(allegro))
THEN
1953 DEALLOCATE (allegro)
1955 END SUBROUTINE pair_potential_allegro_release
1962 SUBROUTINE pair_potential_bmhft_create(ft)
1965 cpassert(.NOT.
ASSOCIATED(ft))
1967 CALL pair_potential_bmhft_clean(ft)
1968 END SUBROUTINE pair_potential_bmhft_create
1976 SUBROUTINE pair_potential_bmhft_copy(ft_source, ft_dest)
1979 IF (.NOT.
ASSOCIATED(ft_source))
RETURN
1980 IF (
ASSOCIATED(ft_dest))
CALL pair_potential_bmhft_release(ft_dest)
1981 CALL pair_potential_bmhft_create(ft_dest)
1982 ft_dest%A = ft_source%A
1983 ft_dest%B = ft_source%B
1984 ft_dest%C = ft_source%C
1985 ft_dest%D = ft_source%D
1986 END SUBROUTINE pair_potential_bmhft_copy
1993 SUBROUTINE pair_potential_bmhft_clean(ft)
1996 IF (.NOT.
ASSOCIATED(ft))
RETURN
2001 END SUBROUTINE pair_potential_bmhft_clean
2008 SUBROUTINE pair_potential_bmhft_release(ft)
2011 IF (
ASSOCIATED(ft))
THEN
2015 END SUBROUTINE pair_potential_bmhft_release
2022 SUBROUTINE pair_potential_bmhftd_create(ftd)
2023 TYPE(ftd_pot_type),
POINTER :: ftd
2025 cpassert(.NOT.
ASSOCIATED(ftd))
2027 CALL pair_potential_bmhftd_clean(ftd)
2028 END SUBROUTINE pair_potential_bmhftd_create
2036 SUBROUTINE pair_potential_bmhftd_copy(ftd_source, ftd_dest)
2037 TYPE(ftd_pot_type),
POINTER :: ftd_source, ftd_dest
2039 IF (.NOT.
ASSOCIATED(ftd_source))
RETURN
2040 IF (
ASSOCIATED(ftd_dest))
CALL pair_potential_bmhftd_release(ftd_dest)
2041 CALL pair_potential_bmhftd_create(ftd_dest)
2042 ftd_dest%A = ftd_source%A
2043 ftd_dest%B = ftd_source%B
2044 ftd_dest%C = ftd_source%C
2045 ftd_dest%D = ftd_source%D
2046 ftd_dest%BD = ftd_source%BD
2047 END SUBROUTINE pair_potential_bmhftd_copy
2054 SUBROUTINE pair_potential_bmhftd_clean(ftd)
2055 TYPE(ftd_pot_type),
POINTER :: ftd
2057 IF (.NOT.
ASSOCIATED(ftd))
RETURN
2063 END SUBROUTINE pair_potential_bmhftd_clean
2070 SUBROUTINE pair_potential_bmhftd_release(ftd)
2071 TYPE(ftd_pot_type),
POINTER :: ftd
2073 IF (
ASSOCIATED(ftd))
THEN
2077 END SUBROUTINE pair_potential_bmhftd_release
2084 SUBROUTINE pair_potential_ipbv_create(ipbv)
2087 cpassert(.NOT.
ASSOCIATED(ipbv))
2089 CALL pair_potential_ipbv_clean(ipbv)
2090 END SUBROUTINE pair_potential_ipbv_create
2098 SUBROUTINE pair_potential_ipbv_copy(ipbv_source, ipbv_dest)
2101 IF (.NOT.
ASSOCIATED(ipbv_source))
RETURN
2102 IF (
ASSOCIATED(ipbv_dest))
CALL pair_potential_ipbv_release(ipbv_dest)
2103 CALL pair_potential_ipbv_create(ipbv_dest)
2104 ipbv_dest%a = ipbv_source%a
2105 ipbv_dest%rcore = ipbv_source%rcore
2106 ipbv_dest%b = ipbv_source%b
2107 ipbv_dest%m = ipbv_source%m
2108 END SUBROUTINE pair_potential_ipbv_copy
2115 SUBROUTINE pair_potential_ipbv_clean(ipbv)
2118 IF (.NOT.
ASSOCIATED(ipbv))
RETURN
2123 END SUBROUTINE pair_potential_ipbv_clean
2130 SUBROUTINE pair_potential_ipbv_release(ipbv)
2133 IF (
ASSOCIATED(ipbv))
THEN
2137 END SUBROUTINE pair_potential_ipbv_release
2144 SUBROUTINE pair_potential_buck4r_create(buck4r)
2145 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2147 cpassert(.NOT.
ASSOCIATED(buck4r))
2149 CALL pair_potential_buck4r_clean(buck4r)
2150 END SUBROUTINE pair_potential_buck4r_create
2158 SUBROUTINE pair_potential_buck4r_copy(buck4r_source, buck4r_dest)
2159 TYPE(buck4ran_pot_type),
POINTER :: buck4r_source, buck4r_dest
2161 IF (.NOT.
ASSOCIATED(buck4r_source))
RETURN
2162 IF (
ASSOCIATED(buck4r_dest))
CALL pair_potential_buck4r_release(buck4r_dest)
2163 CALL pair_potential_buck4r_create(buck4r_dest)
2164 buck4r_dest%a = buck4r_source%a
2165 buck4r_dest%b = buck4r_source%b
2166 buck4r_dest%c = buck4r_source%c
2167 buck4r_dest%r1 = buck4r_source%r1
2168 buck4r_dest%r2 = buck4r_source%r2
2169 buck4r_dest%r3 = buck4r_source%r3
2170 buck4r_dest%poly1 = buck4r_source%poly1
2171 buck4r_dest%poly2 = buck4r_source%poly2
2172 buck4r_dest%npoly1 = buck4r_source%npoly1
2173 buck4r_dest%npoly2 = buck4r_source%npoly2
2174 END SUBROUTINE pair_potential_buck4r_copy
2181 SUBROUTINE pair_potential_buck4r_clean(buck4r)
2182 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2184 IF (.NOT.
ASSOCIATED(buck4r))
RETURN
2191 buck4r%poly1 = 0.0_dp
2193 buck4r%poly2 = 0.0_dp
2195 END SUBROUTINE pair_potential_buck4r_clean
2202 SUBROUTINE pair_potential_buck4r_release(buck4r)
2203 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2205 IF (
ASSOCIATED(buck4r))
THEN
2209 END SUBROUTINE pair_potential_buck4r_release
2216 SUBROUTINE pair_potential_buckmo_create(buckmo)
2217 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2219 cpassert(.NOT.
ASSOCIATED(buckmo))
2221 CALL pair_potential_buckmo_clean(buckmo)
2222 END SUBROUTINE pair_potential_buckmo_create
2230 SUBROUTINE pair_potential_buckmo_copy(buckmo_source, buckmo_dest)
2231 TYPE(buckmorse_pot_type),
POINTER :: buckmo_source, buckmo_dest
2233 IF (.NOT.
ASSOCIATED(buckmo_source))
RETURN
2234 IF (
ASSOCIATED(buckmo_dest))
CALL pair_potential_buckmo_release(buckmo_dest)
2235 CALL pair_potential_buckmo_create(buckmo_dest)
2236 buckmo_dest%f0 = buckmo_source%f0
2237 buckmo_dest%a1 = buckmo_source%a1
2238 buckmo_dest%a2 = buckmo_source%a2
2239 buckmo_dest%b1 = buckmo_source%b1
2240 buckmo_dest%b2 = buckmo_source%b2
2241 buckmo_dest%c = buckmo_source%c
2242 buckmo_dest%d = buckmo_source%d
2243 buckmo_dest%r0 = buckmo_source%r0
2244 buckmo_dest%beta = buckmo_source%beta
2245 END SUBROUTINE pair_potential_buckmo_copy
2252 SUBROUTINE pair_potential_buckmo_clean(buckmo)
2253 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2255 IF (.NOT.
ASSOCIATED(buckmo))
RETURN
2264 buckmo%beta = 0.0_dp
2265 END SUBROUTINE pair_potential_buckmo_clean
2272 SUBROUTINE pair_potential_buckmo_release(buckmo)
2273 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2275 IF (
ASSOCIATED(buckmo))
THEN
2279 END SUBROUTINE pair_potential_buckmo_release
2286 SUBROUTINE pair_potential_tersoff_create(tersoff)
2289 cpassert(.NOT.
ASSOCIATED(tersoff))
2291 CALL pair_potential_tersoff_clean(tersoff)
2292 END SUBROUTINE pair_potential_tersoff_create
2300 SUBROUTINE pair_potential_tersoff_copy(tersoff_source, tersoff_dest)
2303 IF (.NOT.
ASSOCIATED(tersoff_source))
RETURN
2304 IF (
ASSOCIATED(tersoff_dest))
CALL pair_potential_tersoff_release(tersoff_dest)
2305 CALL pair_potential_tersoff_create(tersoff_dest)
2306 tersoff_dest%A = tersoff_source%A
2307 tersoff_dest%B = tersoff_source%B
2308 tersoff_dest%lambda1 = tersoff_source%lambda1
2309 tersoff_dest%lambda2 = tersoff_source%lambda2
2310 tersoff_dest%alpha = tersoff_source%alpha
2311 tersoff_dest%beta = tersoff_source%beta
2312 tersoff_dest%n = tersoff_source%n
2313 tersoff_dest%c = tersoff_source%c
2314 tersoff_dest%d = tersoff_source%d
2315 tersoff_dest%h = tersoff_source%h
2316 tersoff_dest%lambda3 = tersoff_source%lambda3
2317 tersoff_dest%bigR = tersoff_source%bigR
2318 tersoff_dest%bigD = tersoff_source%bigD
2319 tersoff_dest%rcutsq = tersoff_source%rcutsq
2320 END SUBROUTINE pair_potential_tersoff_copy
2327 SUBROUTINE pair_potential_tersoff_clean(tersoff)
2330 IF (.NOT.
ASSOCIATED(tersoff))
RETURN
2333 tersoff%lambda1 = 0.0_dp
2334 tersoff%lambda2 = 0.0_dp
2335 tersoff%alpha = 0.0_dp
2336 tersoff%beta = 0.0_dp
2341 tersoff%lambda3 = 0.0_dp
2342 tersoff%bigR = 0.0_dp
2343 tersoff%bigD = 0.0_dp
2344 tersoff%rcutsq = 0.0_dp
2345 END SUBROUTINE pair_potential_tersoff_clean
2352 SUBROUTINE pair_potential_tersoff_release(tersoff)
2355 IF (
ASSOCIATED(tersoff))
THEN
2356 DEALLOCATE (tersoff)
2359 END SUBROUTINE pair_potential_tersoff_release
2366 SUBROUTINE pair_potential_siepmann_create(siepmann)
2369 cpassert(.NOT.
ASSOCIATED(siepmann))
2371 CALL pair_potential_siepmann_clean(siepmann)
2372 END SUBROUTINE pair_potential_siepmann_create
2379 SUBROUTINE pair_potential_siepmann_copy(siepmann_source, siepmann_dest)
2382 IF (.NOT.
ASSOCIATED(siepmann_source))
RETURN
2383 IF (
ASSOCIATED(siepmann_dest))
CALL pair_potential_siepmann_release(siepmann_dest)
2384 CALL pair_potential_siepmann_create(siepmann_dest)
2385 siepmann_dest%B = siepmann_source%B
2386 siepmann_dest%D = siepmann_source%D
2387 siepmann_dest%E = siepmann_source%E
2388 siepmann_dest%F = siepmann_source%F
2389 siepmann_dest%beta = siepmann_source%beta
2390 siepmann_dest%rcutsq = siepmann_source%rcutsq
2391 siepmann_dest%allow_oh_formation = siepmann_source%allow_oh_formation
2392 siepmann_dest%allow_h3o_formation = siepmann_source%allow_h3o_formation
2393 siepmann_dest%allow_o_formation = siepmann_source%allow_o_formation
2395 END SUBROUTINE pair_potential_siepmann_copy
2402 SUBROUTINE pair_potential_siepmann_clean(siepmann)
2405 IF (.NOT.
ASSOCIATED(siepmann))
RETURN
2410 siepmann%beta = 0.0_dp
2411 siepmann%rcutsq = 0.0_dp
2412 siepmann%allow_oh_formation = .false.
2413 siepmann%allow_h3o_formation = .false.
2414 siepmann%allow_o_formation = .false.
2416 END SUBROUTINE pair_potential_siepmann_clean
2423 SUBROUTINE pair_potential_siepmann_release(siepmann)
2426 IF (
ASSOCIATED(siepmann))
THEN
2427 DEALLOCATE (siepmann)
2430 END SUBROUTINE pair_potential_siepmann_release
2437 SUBROUTINE pair_potential_gal_create(gal)
2440 cpassert(.NOT.
ASSOCIATED(gal))
2442 CALL pair_potential_gal_clean(gal)
2443 END SUBROUTINE pair_potential_gal_create
2451 SUBROUTINE pair_potential_gal_copy(gal_source, gal_dest)
2454 IF (.NOT.
ASSOCIATED(gal_source))
RETURN
2455 IF (
ASSOCIATED(gal_dest))
CALL pair_potential_gal_release(gal_dest)
2456 CALL pair_potential_gal_create(gal_dest)
2457 gal_dest%met1 = gal_source%met1
2458 gal_dest%met2 = gal_source%met2
2459 gal_dest%epsilon = gal_source%epsilon
2460 gal_dest%bxy = gal_source%bxy
2461 gal_dest%bz = gal_source%bz
2462 gal_dest%r1 = gal_source%r1
2463 gal_dest%r2 = gal_source%r2
2464 gal_dest%a1 = gal_source%a1
2465 gal_dest%a2 = gal_source%a2
2466 gal_dest%a3 = gal_source%a3
2467 gal_dest%a4 = gal_source%a4
2468 gal_dest%a = gal_source%a
2469 gal_dest%b = gal_source%b
2470 gal_dest%c = gal_source%c
2471 ALLOCATE (gal_dest%gcn(
SIZE(gal_source%gcn)))
2472 gal_dest%gcn = gal_source%gcn
2473 gal_dest%express = gal_source%express
2474 gal_dest%rcutsq = gal_source%rcutsq
2476 END SUBROUTINE pair_potential_gal_copy
2483 SUBROUTINE pair_potential_gal_clean(gal)
2486 IF (.NOT.
ASSOCIATED(gal))
RETURN
2487 gal%epsilon = 0.0_dp
2500 gal%express = .false.
2502 END SUBROUTINE pair_potential_gal_clean
2509 SUBROUTINE pair_potential_gal_release(gal)
2512 IF (
ASSOCIATED(gal))
THEN
2513 DEALLOCATE (gal%gcn)
2517 END SUBROUTINE pair_potential_gal_release
2524 SUBROUTINE pair_potential_gal21_create(gal21)
2527 cpassert(.NOT.
ASSOCIATED(gal21))
2529 CALL pair_potential_gal21_clean(gal21)
2530 END SUBROUTINE pair_potential_gal21_create
2538 SUBROUTINE pair_potential_gal21_copy(gal21_source, gal21_dest)
2541 IF (.NOT.
ASSOCIATED(gal21_source))
RETURN
2542 IF (
ASSOCIATED(gal21_dest))
CALL pair_potential_gal21_release(gal21_dest)
2543 CALL pair_potential_gal21_create(gal21_dest)
2544 gal21_dest%met1 = gal21_source%met1
2545 gal21_dest%met2 = gal21_source%met2
2546 gal21_dest%epsilon1 = gal21_source%epsilon1
2547 gal21_dest%epsilon2 = gal21_source%epsilon2
2548 gal21_dest%epsilon3 = gal21_source%epsilon3
2549 gal21_dest%bxy1 = gal21_source%bxy1
2550 gal21_dest%bxy2 = gal21_source%bxy2
2551 gal21_dest%bz1 = gal21_source%bz1
2552 gal21_dest%bz2 = gal21_source%bz2
2553 gal21_dest%r1 = gal21_source%r1
2554 gal21_dest%r2 = gal21_source%r2
2555 gal21_dest%a11 = gal21_source%a11
2556 gal21_dest%a12 = gal21_source%a12
2557 gal21_dest%a13 = gal21_source%a13
2558 gal21_dest%a21 = gal21_source%a21
2559 gal21_dest%a22 = gal21_source%a22
2560 gal21_dest%a23 = gal21_source%a23
2561 gal21_dest%a31 = gal21_source%a31
2562 gal21_dest%a32 = gal21_source%a32
2563 gal21_dest%a33 = gal21_source%a33
2564 gal21_dest%a41 = gal21_source%a41
2565 gal21_dest%a42 = gal21_source%a42
2566 gal21_dest%a43 = gal21_source%a43
2567 gal21_dest%AO1 = gal21_source%AO1
2568 gal21_dest%AO2 = gal21_source%AO2
2569 gal21_dest%BO1 = gal21_source%BO1
2570 gal21_dest%BO2 = gal21_source%BO2
2571 gal21_dest%c = gal21_source%c
2572 gal21_dest%AH1 = gal21_source%AH1
2573 gal21_dest%AH2 = gal21_source%AH2
2574 gal21_dest%BH1 = gal21_source%BH1
2575 gal21_dest%BH2 = gal21_source%BH2
2576 ALLOCATE (gal21_dest%gcn(
SIZE(gal21_source%gcn)))
2577 gal21_dest%gcn = gal21_source%gcn
2578 gal21_dest%express = gal21_source%express
2579 gal21_dest%rcutsq = gal21_source%rcutsq
2581 END SUBROUTINE pair_potential_gal21_copy
2588 SUBROUTINE pair_potential_gal21_clean(gal21)
2591 IF (.NOT.
ASSOCIATED(gal21))
RETURN
2592 gal21%epsilon1 = 0.0_dp
2593 gal21%epsilon2 = 0.0_dp
2594 gal21%epsilon3 = 0.0_dp
2622 gal21%rcutsq = 0.0_dp
2623 gal21%express = .false.
2625 END SUBROUTINE pair_potential_gal21_clean
2632 SUBROUTINE pair_potential_gal21_release(gal21)
2635 IF (
ASSOCIATED(gal21))
THEN
2636 DEALLOCATE (gal21%gcn)
2640 END SUBROUTINE pair_potential_gal21_release
2647 SUBROUTINE pair_potential_tab_create(tab)
2650 cpassert(.NOT.
ASSOCIATED(tab))
2652 NULLIFY (tab%r, tab%e, tab%f)
2653 CALL pair_potential_tab_clean(tab)
2654 END SUBROUTINE pair_potential_tab_create
2661 SUBROUTINE pair_potential_tab_copy(tab_source, tab_dest)
2664 IF (.NOT.
ASSOCIATED(tab_source))
RETURN
2665 IF (
ASSOCIATED(tab_dest))
CALL pair_potential_tab_release(tab_dest)
2666 CALL pair_potential_tab_create(tab_dest)
2667 tab_dest%tabpot_file_name = tab_source%tabpot_file_name
2668 tab_dest%dr = tab_source%dr
2669 tab_dest%rcut = tab_source%rcut
2670 tab_dest%npoints = tab_source%npoints
2671 tab_dest%index = tab_source%index
2673 CALL reallocate(tab_dest%r, 1, tab_dest%npoints)
2674 CALL reallocate(tab_dest%e, 1, tab_dest%npoints)
2675 CALL reallocate(tab_dest%f, 1, tab_dest%npoints)
2676 tab_dest%r = tab_source%r
2677 tab_dest%e = tab_source%e
2678 tab_dest%f = tab_source%f
2679 END SUBROUTINE pair_potential_tab_copy
2685 SUBROUTINE pair_potential_tab_clean(tab)
2688 IF (.NOT.
ASSOCIATED(tab))
RETURN
2689 tab%tabpot_file_name =
'NULL'
2698 END SUBROUTINE pair_potential_tab_clean
2704 SUBROUTINE pair_potential_tab_release(tab)
2707 IF (
ASSOCIATED(tab))
THEN
2708 IF (
ASSOCIATED(tab%r))
THEN
2711 IF (
ASSOCIATED(tab%e))
THEN
2714 IF (
ASSOCIATED(tab%f))
THEN
2719 END SUBROUTINE pair_potential_tab_release
Defines the basic variable types.
integer, parameter, public dp
integer, parameter, public default_string_length
integer, parameter, public default_path_length
Utility routines for the memory handling.
integer, parameter, public sh_sh
integer, parameter, public nosh_nosh
integer, dimension(21), parameter, public list_pot
integer, parameter, public lj_charmm_type
integer, parameter, public allegro_type
integer, parameter, public bm_type
integer, parameter, public gal_type
subroutine, public pair_potential_pp_release(potparm)
Release Data-structure that constains potential parameters.
integer, parameter, public nequip_type
integer, parameter, public wl_type
integer, parameter, public ft_type
integer, parameter, public tab_type
integer, parameter, public ftd_type
integer, parameter, public ip_type
subroutine, public pair_potential_p_release(potparm)
Release Data-structure that constains potential parameters.
integer, parameter, public lj_type
integer, parameter, public deepmd_type
subroutine, public pair_potential_single_copy(potparm_source, potparm_dest)
Copy two potential parameter type.
integer, parameter, public nn_type
integer, parameter, public multi_type
integer, parameter, public quip_type
integer, parameter, public gp_type
subroutine, public pair_potential_single_add(potparm_source, potparm_dest)
Add potential parameter type to an existing potential parameter type Used in case of multiple_potenti...
integer, parameter, public siepmann_type
integer, parameter, public nosh_sh
subroutine, public pair_potential_single_clean(potparm)
Cleans the potential parameter type.
subroutine, public pair_potential_lj_create(lj)
Cleans the LJ potential type.
integer, dimension(2), parameter, public do_potential_single_allocation
subroutine, public compare_pot(pot1, pot2, compare)
compare two different potentials
integer, parameter, public gw_type
subroutine, public pair_potential_reallocate(p, lb1_new, ub1_new, lj, lj_charmm, williams, goodwin, eam, quip, nequip, allegro, bmhft, bmhftd, ipbv, buck4r, buckmo, gp, tersoff, siepmann, gal, gal21, tab, deepmd)
Cleans the potential parameter type.
real(kind=dp), parameter, public not_initialized
subroutine, public pair_potential_pp_create(potparm, nkinds)
Data-structure that constains potential parameters.
integer, dimension(3), parameter, public list_sh_type
integer, dimension(2), parameter, public no_potential_single_allocation
integer, parameter, public b4_type
integer, parameter, public gal21_type
integer, dimension(2), public potential_single_allocation
integer, parameter, public ea_type
integer, parameter, public tersoff_type
routines for handling splines_types
subroutine, public spline_data_p_copy(spl_p_source, spl_p_dest)
Copy Data-structure of spline_data_p_type.
subroutine, public spline_factor_release(spline_factor)
releases spline_factor
subroutine, public spline_data_p_release(spl_p)
releases spline_data_p
subroutine, public spline_factor_copy(spline_factor_source, spline_factor_dest)
releases spline_factor