27#include "./base/base_uses.f90"
31 CHARACTER(len=*),
PARAMETER,
PRIVATE :: moduleN =
'pair_potential_types'
126 REAL(kind=
dp),
DIMENSION(2:15) :: a = 0.0_dp
127 REAL(kind=
dp) :: rcore = 0.0_dp
128 REAL(kind=
dp) :: m = 0.0_dp
129 REAL(kind=
dp) :: b = 0.0_dp
134 REAL(kind=
dp) :: epsilon = 0.0_dp
135 REAL(kind=
dp) :: sigma6 = 0.0_dp
136 REAL(kind=
dp) :: sigma12 = 0.0_dp
141 REAL(kind=
dp) :: a = 0.0_dp
142 REAL(kind=
dp) :: b = 0.0_dp
143 REAL(kind=
dp) :: c = 0.0_dp
144 REAL(kind=
dp) :: d = 0.0_dp
149 REAL(kind=
dp) :: a = 0.0_dp
150 REAL(kind=
dp) :: b = 0.0_dp
151 REAL(kind=
dp) :: c = 0.0_dp
152 REAL(kind=
dp) :: d = 0.0_dp
153 REAL(kind=
dp),
DIMENSION(2) :: bd = 0.0_dp
154 END TYPE ftd_pot_type
157 TYPE williams_pot_type
158 REAL(kind=
dp) :: a = 0.0_dp
159 REAL(kind=
dp) :: b = 0.0_dp
160 REAL(kind=
dp) :: c = 0.0_dp
161 END TYPE williams_pot_type
164 TYPE goodwin_pot_type
165 REAL(kind=
dp) :: vr0 = 0.0_dp
166 REAL(kind=
dp) :: m = 0.0_dp, mc = 0.0_dp
167 REAL(kind=
dp) :: d = 0.0_dp, dc = 0.0_dp
168 END TYPE goodwin_pot_type
172 CHARACTER(LEN=default_path_length) :: eam_file_name =
""
173 INTEGER :: npoints = 0
174 REAL(kind=
dp) :: drar = 0.0_dp, drhoar = 0.0_dp, acutal = 0.0_dp
175 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: rho => null(), phi => null(), frho => null(), rhoval => null(), rval => null()
176 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: rhop => null(), phip => null(), frhop => null()
181 CHARACTER(LEN=default_path_length) :: ace_file_name =
'NULL'
182 INTEGER :: atom_ace_type = 0
188 CHARACTER(LEN=default_path_length) :: deepmd_file_name =
'NULL'
189 INTEGER :: atom_deepmd_type = 0
194 CHARACTER(LEN=default_path_length) :: nequip_file_name =
'NULL', nequip_version =
'NULL', &
195 unit_coords =
'NULL', unit_forces =
'NULL', &
196 unit_energy =
'NULL', unit_cell =
'NULL'
197 CHARACTER(LEN=100),
DIMENSION(:),
ALLOCATABLE :: type_names_torch
198 REAL(kind=
dp) :: rcutsq = 0.0_dp, unit_coords_val = 1.0_dp, &
199 unit_forces_val = 1.0_dp, unit_energy_val = 1.0_dp, &
200 unit_cell_val = 1.0_dp
201 LOGICAL :: do_nequip_sp = .false.
206 CHARACTER(LEN=default_path_length) :: allegro_file_name =
'NULL', unit_cell =
'NULL', &
207 nequip_version =
'NULL', unit_coords =
'NULL', &
208 unit_forces =
'NULL', unit_energy =
'NULL'
210 CHARACTER(LEN=100),
DIMENSION(:),
ALLOCATABLE :: type_names_torch
212 REAL(kind=
dp) :: rcutsq = 0.0_dp, unit_coords_val = 1.0_dp, &
213 unit_forces_val = 1.0_dp, unit_cell_val = 1.0_dp, &
214 unit_energy_val = 1.0_dp
215 LOGICAL :: do_allegro_sp = .false.
219 TYPE buck4ran_pot_type
220 REAL(kind=
dp) :: a = 0.0_dp
221 REAL(kind=
dp) :: b = 0.0_dp
222 REAL(kind=
dp) :: c = 0.0_dp
223 REAL(kind=
dp) :: r1 = 0.0_dp
224 REAL(kind=
dp) :: r2 = 0.0_dp
225 REAL(kind=
dp) :: r3 = 0.0_dp
226 INTEGER :: npoly1 = 0, npoly2 = 0
227 REAL(kind=
dp),
DIMENSION(0:10) :: poly1 = 0.0_dp
228 REAL(kind=
dp),
DIMENSION(0:10) :: poly2 = 0.0_dp
229 END TYPE buck4ran_pot_type
232 TYPE buckmorse_pot_type
233 REAL(kind=
dp) :: f0 = 0.0_dp
234 REAL(kind=
dp) :: a1 = 0.0_dp
235 REAL(kind=
dp) :: a2 = 0.0_dp
236 REAL(kind=
dp) :: b1 = 0.0_dp
237 REAL(kind=
dp) :: b2 = 0.0_dp
238 REAL(kind=
dp) :: c = 0.0_dp
239 REAL(kind=
dp) :: d = 0.0_dp
240 REAL(kind=
dp) :: r0 = 0.0_dp
241 REAL(kind=
dp) :: beta = 0.0_dp
242 END TYPE buckmorse_pot_type
247 CHARACTER(LEN=default_path_length) :: potential =
""
248 CHARACTER(LEN=default_string_length), &
249 POINTER,
DIMENSION(:) :: parameters => null(), units => null()
250 CHARACTER(LEN=default_string_length) :: variables =
""
251 REAL(kind=
dp),
DIMENSION(:),
POINTER :: values => null()
257 REAL(kind=
dp) :: a = 0.0_dp
258 REAL(kind=
dp) :: b = 0.0_dp
259 REAL(kind=
dp) :: lambda1 = 0.0_dp
260 REAL(kind=
dp) :: lambda2 = 0.0_dp
261 REAL(kind=
dp) :: alpha = 0.0_dp
262 REAL(kind=
dp) :: beta = 0.0_dp
263 REAL(kind=
dp) :: n = 0.0_dp
264 REAL(kind=
dp) :: c = 0.0_dp
265 REAL(kind=
dp) :: d = 0.0_dp
266 REAL(kind=
dp) :: h = 0.0_dp
267 REAL(kind=
dp) :: lambda3 = 0.0_dp
268 REAL(kind=
dp) :: bigr = 0.0_dp
269 REAL(kind=
dp) :: bigd = 0.0_dp
270 REAL(kind=
dp) :: rcutsq = 0.0_dp
275 REAL(kind=
dp) :: b = 0.0_dp
276 REAL(kind=
dp) :: d = 0.0_dp
277 REAL(kind=
dp) :: e = 0.0_dp
278 REAL(kind=
dp) :: f = 0.0_dp
279 REAL(kind=
dp) :: beta = 0.0_dp
280 REAL(kind=
dp) :: rcutsq = 0.0_dp
281 LOGICAL :: allow_oh_formation = .false.
282 LOGICAL :: allow_h3o_formation = .false.
283 LOGICAL :: allow_o_formation = .false.
288 CHARACTER(LEN=2) :: met1 =
""
289 CHARACTER(LEN=2) :: met2 =
""
290 REAL(kind=
dp) :: epsilon = 0.0_dp
291 REAL(kind=
dp) :: bxy = 0.0_dp
292 REAL(kind=
dp) :: bz = 0.0_dp
293 REAL(kind=
dp) :: r1 = 0.0_dp
294 REAL(kind=
dp) :: r2 = 0.0_dp
295 REAL(kind=
dp) :: a1 = 0.0_dp
296 REAL(kind=
dp) :: a2 = 0.0_dp
297 REAL(kind=
dp) :: a3 = 0.0_dp
298 REAL(kind=
dp) :: a4 = 0.0_dp
299 REAL(kind=
dp) :: a = 0.0_dp
300 REAL(kind=
dp) :: b = 0.0_dp
301 REAL(kind=
dp) :: c = 0.0_dp
302 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: gcn => null()
303 REAL(kind=
dp),
ALLOCATABLE,
DIMENSION(:, :) :: n_vectors
304 REAL(kind=
dp) :: rcutsq = 0.0_dp
305 LOGICAL :: express = .false.
311 CHARACTER(LEN=2) :: met1 =
""
312 CHARACTER(LEN=2) :: met2 =
""
313 REAL(kind=
dp) :: epsilon1 = 0.0_dp
314 REAL(kind=
dp) :: epsilon2 = 0.0_dp
315 REAL(kind=
dp) :: epsilon3 = 0.0_dp
316 REAL(kind=
dp) :: bxy1 = 0.0_dp
317 REAL(kind=
dp) :: bxy2 = 0.0_dp
318 REAL(kind=
dp) :: bz1 = 0.0_dp
319 REAL(kind=
dp) :: bz2 = 0.0_dp
320 REAL(kind=
dp) :: r1 = 0.0_dp
321 REAL(kind=
dp) :: r2 = 0.0_dp
322 REAL(kind=
dp) :: a11 = 0.0_dp
323 REAL(kind=
dp) :: a12 = 0.0_dp
324 REAL(kind=
dp) :: a13 = 0.0_dp
325 REAL(kind=
dp) :: a21 = 0.0_dp
326 REAL(kind=
dp) :: a22 = 0.0_dp
327 REAL(kind=
dp) :: a23 = 0.0_dp
328 REAL(kind=
dp) :: a31 = 0.0_dp
329 REAL(kind=
dp) :: a32 = 0.0_dp
330 REAL(kind=
dp) :: a33 = 0.0_dp
331 REAL(kind=
dp) :: a41 = 0.0_dp
332 REAL(kind=
dp) :: a42 = 0.0_dp
333 REAL(kind=
dp) :: a43 = 0.0_dp
334 REAL(kind=
dp) :: ao1 = 0.0_dp
335 REAL(kind=
dp) :: ao2 = 0.0_dp
336 REAL(kind=
dp) :: bo1 = 0.0_dp
337 REAL(kind=
dp) :: bo2 = 0.0_dp
338 REAL(kind=
dp) :: c = 0.0_dp
339 REAL(kind=
dp) :: ah1 = 0.0_dp
340 REAL(kind=
dp) :: ah2 = 0.0_dp
341 REAL(kind=
dp) :: bh1 = 0.0_dp
342 REAL(kind=
dp) :: bh2 = 0.0_dp
343 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: gcn => null()
344 REAL(kind=
dp),
ALLOCATABLE,
DIMENSION(:, :) :: n_vectors
345 REAL(kind=
dp) :: rcutsq = 0.0_dp
346 LOGICAL :: express = .false.
352 CHARACTER(LEN=default_path_length) :: tabpot_file_name =
""
353 INTEGER :: npoints = 0, index = 0
354 REAL(kind=
dp) :: dr = 0.0_dp, rcut = 0.0_dp
355 REAL(kind=
dp),
POINTER,
DIMENSION(:) :: r => null(), e => null(), f => null()
361 REAL(kind=
dp) :: rmin = 0.0_dp, rmax = 0.0_dp
363 TYPE(gp_pot_type),
POINTER :: gp => null()
364 TYPE(lj_pot_type),
POINTER :: lj => null()
366 TYPE(williams_pot_type),
POINTER :: willis => null()
367 TYPE(goodwin_pot_type),
POINTER :: goodwin => null()
373 TYPE(buck4ran_pot_type),
POINTER :: buck4r => null()
374 TYPE(buckmorse_pot_type),
POINTER :: buckmo => null()
379 TYPE(ftd_pot_type),
POINTER :: ftd => null()
381 END TYPE pot_set_type
385 REAL(kind=
dp) :: rcutsq = 0.0_dp
386 REAL(kind=
dp) :: e_fac = 0.0_dp
387 REAL(kind=
dp) :: e_fcc = 0.0_dp
388 REAL(kind=
dp) :: e_fcs = 0.0_dp
389 REAL(kind=
dp) :: e_fsc = 0.0_dp
390 REAL(kind=
dp) :: z1 = 0.0_dp
391 REAL(kind=
dp) :: z2 = 0.0_dp
392 REAL(kind=
dp),
DIMENSION(0:5) :: zbl_poly = 0.0_dp
393 REAL(kind=
dp),
DIMENSION(2) :: zbl_rcut = 0.0_dp
394 LOGICAL :: undef = .false., &
397 INTEGER :: shell_type = 0
398 CHARACTER(LEN=default_string_length) :: at1 =
""
399 CHARACTER(LEN=default_string_length) :: at2 =
""
400 INTEGER,
POINTER,
DIMENSION(:) ::
TYPE => null()
401 TYPE(pot_set_type),
POINTER,
DIMENSION(:) :: set => null()
407 TYPE pair_potential_type
409 END TYPE pair_potential_type
413 TYPE(pair_potential_type),
DIMENSION(:),
POINTER :: pot => null()
418 TYPE(pair_potential_type),
DIMENSION(:, :),
POINTER :: pot => null()
432 LOGICAL,
INTENT(OUT) :: compare
440 cpassert(
ASSOCIATED(pot1%type))
441 cpassert(
ASSOCIATED(pot2%type))
442 IF (
SIZE(pot1%type) /=
SIZE(pot2%type))
RETURN
443 IF (any(pot1%type /= pot2%type))
RETURN
446 cpassert(
ASSOCIATED(pot1%set))
447 cpassert(
ASSOCIATED(pot2%set))
448 DO i = 1,
SIZE(pot1%type)
450 SELECT CASE (pot1%type(i))
452 IF ((pot1%set(i)%lj%epsilon == pot2%set(i)%lj%epsilon) .AND. &
453 (pot1%set(i)%lj%sigma6 == pot2%set(i)%lj%sigma6) .AND. &
454 (pot1%set(i)%lj%sigma12 == pot2%set(i)%lj%sigma12)) mycompare = .true.
456 IF ((pot1%set(i)%willis%a == pot2%set(i)%willis%a) .AND. &
457 (pot1%set(i)%willis%b == pot2%set(i)%willis%b) .AND. &
458 (pot1%set(i)%willis%c == pot2%set(i)%willis%c)) mycompare = .true.
460 IF ((pot1%set(i)%goodwin%vr0 == pot2%set(i)%goodwin%vr0) .AND. &
461 (pot1%set(i)%goodwin%m == pot2%set(i)%goodwin%m) .AND. &
462 (pot1%set(i)%goodwin%mc == pot2%set(i)%goodwin%mc) .AND. &
463 (pot1%set(i)%goodwin%d == pot2%set(i)%goodwin%d) .AND. &
464 (pot1%set(i)%goodwin%dc == pot2%set(i)%goodwin%dc)) mycompare = .true.
467 IF (pot1%set(i)%eam%npoints == pot2%set(i)%eam%npoints)
THEN
468 IF ((pot1%set(i)%eam%drar == pot2%set(i)%eam%drar) .AND. &
469 (pot1%set(i)%eam%drhoar == pot2%set(i)%eam%drhoar) .AND. &
470 (pot1%set(i)%eam%acutal == pot2%set(i)%eam%acutal) .AND. &
471 (sum(abs(pot1%set(i)%eam%rho - pot2%set(i)%eam%rho)) == 0.0_dp) .AND. &
472 (sum(abs(pot1%set(i)%eam%phi - pot2%set(i)%eam%phi)) == 0.0_dp) .AND. &
473 (sum(abs(pot1%set(i)%eam%frho - pot2%set(i)%eam%frho)) == 0.0_dp) .AND. &
474 (sum(abs(pot1%set(i)%eam%rhoval - pot2%set(i)%eam%rhoval)) == 0.0_dp) .AND. &
475 (sum(abs(pot1%set(i)%eam%rval - pot2%set(i)%eam%rval)) == 0.0_dp) .AND. &
476 (sum(abs(pot1%set(i)%eam%rhop - pot2%set(i)%eam%rhop)) == 0.0_dp) .AND. &
477 (sum(abs(pot1%set(i)%eam%phip - pot2%set(i)%eam%phip)) == 0.0_dp) .AND. &
478 (sum(abs(pot1%set(i)%eam%frhop - pot2%set(i)%eam%frhop)) == 0.0_dp)) mycompare = .true.
481 IF ((pot1%set(i)%ace%ace_file_name == pot2%set(i)%ace%ace_file_name) .AND. &
482 (pot1%set(i)%ace%atom_ace_type == pot2%set(i)%ace%atom_ace_type)) mycompare = .true.
484 IF ((pot1%set(i)%deepmd%deepmd_file_name == pot2%set(i)%deepmd%deepmd_file_name) .AND. &
485 (pot1%set(i)%deepmd%atom_deepmd_type == pot2%set(i)%deepmd%atom_deepmd_type)) 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)%nequip, &
634 potparm%set(i)%allegro, &
635 potparm%set(i)%ace, &
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_nequip_clean(potparm%set(i)%nequip)
680 CALL pair_potential_allegro_clean(potparm%set(i)%allegro)
681 CALL pair_potential_ace_clean(potparm%set(i)%ace)
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_nequip_copy(potparm_source%set(i)%nequip, potparm_dest%set(i)%nequip)
738 CALL pair_potential_allegro_copy(potparm_source%set(i)%allegro, potparm_dest%set(i)%allegro)
739 CALL pair_potential_ace_copy(potparm_source%set(i)%ace, potparm_dest%set(i)%ace)
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)%nequip)) .OR. &
789 (
ASSOCIATED(potparm_dest%set(1)%allegro)) .OR. &
790 (
ASSOCIATED(potparm_dest%set(1)%ace)) .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_nequip_copy(potparm_tmp%set(i)%nequip, potparm_dest%set(i)%nequip)
842 CALL pair_potential_allegro_copy(potparm_tmp%set(i)%allegro, potparm_dest%set(i)%allegro)
843 CALL pair_potential_ace_copy(potparm_tmp%set(i)%ace, potparm_dest%set(i)%ace)
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_nequip_copy(potparm_source%set(j)%nequip, potparm_dest%set(i)%nequip)
879 CALL pair_potential_allegro_copy(potparm_source%set(j)%allegro, potparm_dest%set(i)%allegro)
880 CALL pair_potential_ace_copy(potparm_source%set(j)%ace, potparm_dest%set(i)%ace)
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_nequip_release(potparm%set(i)%nequip)
918 CALL pair_potential_allegro_release(potparm%set(i)%allegro)
919 CALL pair_potential_ace_release(potparm%set(i)%ace)
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 nequip, allegro, bmhft, bmhftd, ipbv, buck4r, buckmo, &
1112 gp, tersoff, siepmann, gal, gal21, tab, deepmd, ace)
1114 INTEGER,
INTENT(IN) :: lb1_new, ub1_new
1115 LOGICAL,
INTENT(IN),
OPTIONAL :: lj, lj_charmm, williams, goodwin, eam, nequip, allegro, &
1116 bmhft, bmhftd, ipbv, buck4r, buckmo, gp, tersoff, siepmann, gal, gal21, tab, deepmd, ace
1118 INTEGER :: i, ipot, lb1_old, std_dim, ub1_old
1119 LOGICAL :: check, lace, lallegro, lbmhft, lbmhftd, lbuck4r, lbuckmo, ldeepmd, leam, lgal, &
1120 lgal21, lgoodwin, lgp, lipbv, llj, llj_charmm, lnequip, lsiepmann, ltab, ltersoff, &
1126 llj = .false.;
IF (
PRESENT(lj)) llj = lj
1127 llj_charmm = .false.;
IF (
PRESENT(lj_charmm)) llj_charmm = lj_charmm
1128 lwilliams = .false.;
IF (
PRESENT(williams)) lwilliams = williams
1129 lgoodwin = .false.;
IF (
PRESENT(goodwin)) lgoodwin = goodwin
1130 leam = .false.;
IF (
PRESENT(eam)) leam = eam
1131 lnequip = .false.;
IF (
PRESENT(nequip)) lnequip = nequip
1132 lallegro = .false.;
IF (
PRESENT(allegro)) lallegro = allegro
1133 lace = .false.;
IF (
PRESENT(ace)) lace = ace
1134 ldeepmd = .false.;
IF (
PRESENT(deepmd)) ldeepmd = deepmd
1135 lbmhft = .false.;
IF (
PRESENT(bmhft)) lbmhft = bmhft
1136 lbmhftd = .false.;
IF (
PRESENT(bmhftd)) lbmhftd = bmhftd
1137 lipbv = .false.;
IF (
PRESENT(ipbv)) lipbv = ipbv
1138 lbuck4r = .false.;
IF (
PRESENT(buck4r)) lbuck4r = buck4r
1139 lbuckmo = .false.;
IF (
PRESENT(buckmo)) lbuckmo = buckmo
1140 lgp = .false.;
IF (
PRESENT(gp)) lgp = gp
1141 ltersoff = .false.;
IF (
PRESENT(tersoff)) ltersoff = tersoff
1142 lsiepmann = .false.;
IF (
PRESENT(siepmann)) lsiepmann = siepmann
1143 lgal = .false.;
IF (
PRESENT(gal)) lgal = gal
1144 lgal21 = .false.;
IF (
PRESENT(gal21)) lgal21 = gal21
1145 ltab = .false.;
IF (
PRESENT(tab)) ltab = tab
1149 check = .NOT. (llj_charmm .OR. lwilliams .OR. lgoodwin .OR. leam .OR. lnequip .OR. lallegro &
1150 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1151 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1154 IF (llj_charmm)
THEN
1156 check = .NOT. (llj .OR. lwilliams .OR. lgoodwin .OR. leam .OR. lnequip .OR. lallegro &
1157 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1158 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1163 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. leam .OR. lnequip .OR. lallegro &
1164 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1165 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1170 check = .NOT. (llj .OR. llj_charmm .OR. lwilliams .OR. leam .OR. lnequip .OR. lallegro &
1171 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1172 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1177 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. lnequip .OR. lallegro &
1178 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1179 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1184 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lallegro &
1185 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1186 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1191 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1192 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1193 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1198 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1199 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp &
1200 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd)
1205 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1206 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp &
1207 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. lace)
1212 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1213 .OR. lallegro .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1214 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1219 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1220 .OR. lallegro .OR. lbmhft .OR. lipbv .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1221 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1226 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1227 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lbuck4r .OR. lbuckmo .OR. lgp .OR. ltersoff &
1228 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1233 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1234 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuckmo .OR. lgp .OR. ltersoff &
1235 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1240 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1241 .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. ltersoff &
1242 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1247 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1248 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1249 .OR. lsiepmann .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1254 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1255 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1256 .OR. ltersoff .OR. lgal .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1261 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1262 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1263 .OR. ltersoff .OR. lsiepmann .OR. lgal21 .OR. ltab .OR. ldeepmd .OR. lace)
1268 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1269 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lbuckmo &
1270 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. ltab .OR. ldeepmd .OR. lace)
1275 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1276 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgal21 .OR. lbuckmo &
1277 .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. ltab .OR. ldeepmd .OR. lace)
1282 check = .NOT. (llj .OR. llj_charmm .OR. lgoodwin .OR. lwilliams .OR. leam .OR. lnequip &
1283 .OR. lallegro .OR. lbmhft .OR. lbmhftd .OR. lipbv .OR. lbuck4r .OR. lgp .OR. lgal21 &
1284 .OR. lbuckmo .OR. ltersoff .OR. lsiepmann .OR. lgal .OR. lace)
1290 IF (
ASSOCIATED(p))
THEN
1291 lb1_old = lbound(p%pot, 1)
1292 ub1_old = ubound(p%pot, 1)
1293 CALL pair_potential_p_create(work, lb=lb1_old, ub=ub1_old)
1294 CALL pair_potential_p_copy(p, work)
1298 CALL pair_potential_p_create(p, lb=lb1_new, ub=ub1_new)
1299 IF (
ASSOCIATED(work))
THEN
1300 CALL pair_potential_p_copy(work, p, istart=lb1_old, iend=ub1_old)
1303 DO i = ub1_old + 1, ub1_new
1304 check = (
SIZE(p%pot(i)%pot%type) == std_dim) .AND. (
SIZE(p%pot(i)%pot%type) == std_dim)
1308 p%pot(i)%pot%undef = .true.
1309 p%pot(i)%pot%no_mb = .false.
1310 p%pot(i)%pot%no_pp = .false.
1311 p%pot(i)%pot%at1 =
'NULL'
1312 p%pot(i)%pot%at2 =
'NULL'
1319 CALL pair_potential_williams_create(p%pot(i)%pot%set(std_dim)%willis)
1321 CALL pair_potential_goodwin_create(p%pot(i)%pot%set(std_dim)%goodwin)
1323 CALL pair_potential_eam_create(p%pot(i)%pot%set(std_dim)%eam)
1325 CALL pair_potential_nequip_create(p%pot(i)%pot%set(std_dim)%nequip)
1327 CALL pair_potential_allegro_create(p%pot(i)%pot%set(std_dim)%allegro)
1329 CALL pair_potential_ace_create(p%pot(i)%pot%set(std_dim)%ace)
1331 CALL pair_potential_deepmd_create(p%pot(i)%pot%set(std_dim)%deepmd)
1333 CALL pair_potential_bmhft_create(p%pot(i)%pot%set(std_dim)%ft)
1335 CALL pair_potential_bmhftd_create(p%pot(i)%pot%set(std_dim)%ftd)
1337 CALL pair_potential_ipbv_create(p%pot(i)%pot%set(std_dim)%ipbv)
1339 CALL pair_potential_buck4r_create(p%pot(i)%pot%set(std_dim)%buck4r)
1341 CALL pair_potential_buckmo_create(p%pot(i)%pot%set(std_dim)%buckmo)
1343 CALL pair_potential_gp_create(p%pot(i)%pot%set(std_dim)%gp)
1345 CALL pair_potential_tersoff_create(p%pot(i)%pot%set(std_dim)%tersoff)
1347 CALL pair_potential_siepmann_create(p%pot(i)%pot%set(std_dim)%siepmann)
1349 CALL pair_potential_gal_create(p%pot(i)%pot%set(std_dim)%gal)
1351 CALL pair_potential_gal21_create(p%pot(i)%pot%set(std_dim)%gal21)
1353 CALL pair_potential_tab_create(p%pot(i)%pot%set(std_dim)%tab)
1355 NULLIFY (p%pot(i)%pot%spl_f)
1356 NULLIFY (p%pot(i)%pot%pair_spline_data)
1367 SUBROUTINE pair_potential_gp_create(gp)
1368 TYPE(gp_pot_type),
POINTER :: gp
1370 cpassert(.NOT.
ASSOCIATED(gp))
1372 NULLIFY (gp%parameters)
1374 CALL pair_potential_gp_clean(gp)
1375 END SUBROUTINE pair_potential_gp_create
1383 SUBROUTINE pair_potential_gp_copy(gp_source, gp_dest)
1384 TYPE(gp_pot_type),
POINTER :: gp_source, gp_dest
1388 IF (.NOT.
ASSOCIATED(gp_source))
RETURN
1389 IF (
ASSOCIATED(gp_dest))
CALL pair_potential_gp_release(gp_dest)
1390 CALL pair_potential_gp_create(gp_dest)
1391 gp_dest%myid = gp_source%myid
1392 gp_dest%potential = gp_source%potential
1393 gp_dest%variables = gp_source%variables
1394 IF (
ASSOCIATED(gp_source%parameters))
THEN
1395 idim =
SIZE(gp_source%parameters)
1396 ALLOCATE (gp_dest%parameters(idim))
1397 gp_dest%parameters = gp_source%parameters
1399 IF (
ASSOCIATED(gp_source%values))
THEN
1400 idim =
SIZE(gp_source%values)
1401 ALLOCATE (gp_dest%values(idim))
1402 gp_dest%values = gp_source%values
1404 END SUBROUTINE pair_potential_gp_copy
1411 SUBROUTINE pair_potential_gp_clean(gp)
1412 TYPE(gp_pot_type),
POINTER :: gp
1414 IF (.NOT.
ASSOCIATED(gp))
RETURN
1418 IF (
ASSOCIATED(gp%values))
THEN
1419 DEALLOCATE (gp%values)
1421 IF (
ASSOCIATED(gp%parameters))
THEN
1422 DEALLOCATE (gp%parameters)
1424 END SUBROUTINE pair_potential_gp_clean
1431 SUBROUTINE pair_potential_gp_release(gp)
1432 TYPE(gp_pot_type),
POINTER :: gp
1434 IF (
ASSOCIATED(gp))
THEN
1435 IF (
ASSOCIATED(gp%parameters))
THEN
1436 DEALLOCATE (gp%parameters)
1438 IF (
ASSOCIATED(gp%values))
THEN
1439 DEALLOCATE (gp%values)
1444 END SUBROUTINE pair_potential_gp_release
1452 TYPE(lj_pot_type),
POINTER :: lj
1454 cpassert(.NOT.
ASSOCIATED(lj))
1456 CALL pair_potential_lj_clean(lj)
1465 SUBROUTINE pair_potential_lj_copy(lj_source, lj_dest)
1466 TYPE(lj_pot_type),
POINTER :: lj_source, lj_dest
1468 IF (.NOT.
ASSOCIATED(lj_source))
RETURN
1469 IF (
ASSOCIATED(lj_dest))
CALL pair_potential_lj_release(lj_dest)
1471 lj_dest%epsilon = lj_source%epsilon
1472 lj_dest%sigma6 = lj_source%sigma6
1473 lj_dest%sigma12 = lj_source%sigma12
1474 END SUBROUTINE pair_potential_lj_copy
1481 SUBROUTINE pair_potential_lj_clean(lj)
1482 TYPE(lj_pot_type),
POINTER :: lj
1484 IF (.NOT.
ASSOCIATED(lj))
RETURN
1488 END SUBROUTINE pair_potential_lj_clean
1495 SUBROUTINE pair_potential_lj_release(lj)
1496 TYPE(lj_pot_type),
POINTER :: lj
1498 IF (
ASSOCIATED(lj))
THEN
1502 END SUBROUTINE pair_potential_lj_release
1509 SUBROUTINE pair_potential_williams_create(willis)
1510 TYPE(williams_pot_type),
POINTER :: willis
1512 cpassert(.NOT.
ASSOCIATED(willis))
1514 CALL pair_potential_williams_clean(willis)
1515 END SUBROUTINE pair_potential_williams_create
1523 SUBROUTINE pair_potential_williams_copy(willis_source, willis_dest)
1524 TYPE(williams_pot_type),
POINTER :: willis_source, willis_dest
1526 IF (.NOT.
ASSOCIATED(willis_source))
RETURN
1527 IF (
ASSOCIATED(willis_dest))
CALL pair_potential_williams_release(willis_dest)
1528 CALL pair_potential_williams_create(willis_dest)
1529 willis_dest%a = willis_source%a
1530 willis_dest%b = willis_source%b
1531 willis_dest%c = willis_source%c
1532 END SUBROUTINE pair_potential_williams_copy
1539 SUBROUTINE pair_potential_williams_clean(willis)
1540 TYPE(williams_pot_type),
POINTER :: willis
1542 IF (.NOT.
ASSOCIATED(willis))
RETURN
1546 END SUBROUTINE pair_potential_williams_clean
1553 SUBROUTINE pair_potential_williams_release(willis)
1554 TYPE(williams_pot_type),
POINTER :: willis
1556 IF (
ASSOCIATED(willis))
THEN
1560 END SUBROUTINE pair_potential_williams_release
1567 SUBROUTINE pair_potential_goodwin_create(goodwin)
1568 TYPE(goodwin_pot_type),
POINTER :: goodwin
1570 cpassert(.NOT.
ASSOCIATED(goodwin))
1572 CALL pair_potential_goodwin_clean(goodwin)
1573 END SUBROUTINE pair_potential_goodwin_create
1581 SUBROUTINE pair_potential_goodwin_copy(goodwin_source, goodwin_dest)
1582 TYPE(goodwin_pot_type),
POINTER :: goodwin_source, goodwin_dest
1584 IF (.NOT.
ASSOCIATED(goodwin_source))
RETURN
1585 IF (
ASSOCIATED(goodwin_dest))
CALL pair_potential_goodwin_release(goodwin_dest)
1586 CALL pair_potential_goodwin_create(goodwin_dest)
1587 goodwin_dest%vr0 = goodwin_source%vr0
1588 goodwin_dest%d = goodwin_source%d
1589 goodwin_dest%dc = goodwin_source%dc
1590 goodwin_dest%m = goodwin_source%m
1591 goodwin_dest%mc = goodwin_source%mc
1592 END SUBROUTINE pair_potential_goodwin_copy
1599 SUBROUTINE pair_potential_goodwin_clean(goodwin)
1600 TYPE(goodwin_pot_type),
POINTER :: goodwin
1602 IF (.NOT.
ASSOCIATED(goodwin))
RETURN
1603 goodwin%vr0 = 0.0_dp
1608 END SUBROUTINE pair_potential_goodwin_clean
1615 SUBROUTINE pair_potential_goodwin_release(goodwin)
1616 TYPE(goodwin_pot_type),
POINTER :: goodwin
1618 IF (
ASSOCIATED(goodwin))
THEN
1619 DEALLOCATE (goodwin)
1622 END SUBROUTINE pair_potential_goodwin_release
1629 SUBROUTINE pair_potential_eam_create(eam)
1632 cpassert(.NOT.
ASSOCIATED(eam))
1634 NULLIFY (eam%rho, eam%phi, eam%frho, eam%rhoval, eam%rval, &
1635 eam%rhop, eam%phip, eam%frhop)
1636 CALL pair_potential_eam_clean(eam)
1637 END SUBROUTINE pair_potential_eam_create
1645 SUBROUTINE pair_potential_eam_copy(eam_source, eam_dest)
1648 IF (.NOT.
ASSOCIATED(eam_source))
RETURN
1649 IF (
ASSOCIATED(eam_dest))
CALL pair_potential_eam_release(eam_dest)
1650 CALL pair_potential_eam_create(eam_dest)
1651 eam_dest%eam_file_name = eam_source%eam_file_name
1652 eam_dest%drar = eam_source%drar
1653 eam_dest%drhoar = eam_source%drhoar
1654 eam_dest%acutal = eam_source%acutal
1655 eam_dest%npoints = eam_source%npoints
1657 CALL reallocate(eam_dest%rho, 1, eam_dest%npoints)
1658 CALL reallocate(eam_dest%rhop, 1, eam_dest%npoints)
1659 CALL reallocate(eam_dest%phi, 1, eam_dest%npoints)
1660 CALL reallocate(eam_dest%phip, 1, eam_dest%npoints)
1661 CALL reallocate(eam_dest%frho, 1, eam_dest%npoints)
1662 CALL reallocate(eam_dest%frhop, 1, eam_dest%npoints)
1663 CALL reallocate(eam_dest%rval, 1, eam_dest%npoints)
1664 CALL reallocate(eam_dest%rhoval, 1, eam_dest%npoints)
1665 eam_dest%rho = eam_source%rho
1666 eam_dest%phi = eam_source%phi
1667 eam_dest%frho = eam_source%frho
1668 eam_dest%rhoval = eam_source%rhoval
1669 eam_dest%rval = eam_source%rval
1670 eam_dest%rhop = eam_source%rhop
1671 eam_dest%phip = eam_source%phip
1672 eam_dest%frhop = eam_source%frhop
1673 END SUBROUTINE pair_potential_eam_copy
1680 SUBROUTINE pair_potential_eam_clean(eam)
1683 IF (.NOT.
ASSOCIATED(eam))
RETURN
1684 eam%eam_file_name =
'NULL'
1697 END SUBROUTINE pair_potential_eam_clean
1704 SUBROUTINE pair_potential_eam_release(eam)
1707 IF (
ASSOCIATED(eam))
THEN
1708 IF (
ASSOCIATED(eam%rho))
THEN
1709 DEALLOCATE (eam%rho)
1711 IF (
ASSOCIATED(eam%rhop))
THEN
1712 DEALLOCATE (eam%rhop)
1714 IF (
ASSOCIATED(eam%phi))
THEN
1715 DEALLOCATE (eam%phi)
1717 IF (
ASSOCIATED(eam%phip))
THEN
1718 DEALLOCATE (eam%phip)
1720 IF (
ASSOCIATED(eam%frho))
THEN
1721 DEALLOCATE (eam%frho)
1723 IF (
ASSOCIATED(eam%frhop))
THEN
1724 DEALLOCATE (eam%frhop)
1726 IF (
ASSOCIATED(eam%rval))
THEN
1727 DEALLOCATE (eam%rval)
1729 IF (
ASSOCIATED(eam%rhoval))
THEN
1730 DEALLOCATE (eam%rhoval)
1734 END SUBROUTINE pair_potential_eam_release
1741 SUBROUTINE pair_potential_ace_create(ace)
1744 cpassert(.NOT.
ASSOCIATED(ace))
1746 END SUBROUTINE pair_potential_ace_create
1754 SUBROUTINE pair_potential_ace_copy(ace_source, ace_dest)
1757 IF (.NOT.
ASSOCIATED(ace_source))
RETURN
1759 IF (
ASSOCIATED(ace_dest))
CALL pair_potential_ace_release(ace_dest)
1760 CALL pair_potential_ace_create(ace_dest)
1761 ace_dest = ace_source
1762 END SUBROUTINE pair_potential_ace_copy
1769 SUBROUTINE pair_potential_ace_clean(ace)
1772 IF (.NOT.
ASSOCIATED(ace))
RETURN
1774 END SUBROUTINE pair_potential_ace_clean
1781 SUBROUTINE pair_potential_ace_release(ace)
1784 IF (
ASSOCIATED(ace))
THEN
1787 END SUBROUTINE pair_potential_ace_release
1794 SUBROUTINE pair_potential_deepmd_create(deepmd)
1797 cpassert(.NOT.
ASSOCIATED(deepmd))
1799 END SUBROUTINE pair_potential_deepmd_create
1807 SUBROUTINE pair_potential_deepmd_copy(deepmd_source, deepmd_dest)
1810 IF (.NOT.
ASSOCIATED(deepmd_source))
RETURN
1811 NULLIFY (deepmd_dest)
1812 IF (
ASSOCIATED(deepmd_dest))
CALL pair_potential_deepmd_release(deepmd_dest)
1813 CALL pair_potential_deepmd_create(deepmd_dest)
1814 deepmd_dest = deepmd_source
1815 END SUBROUTINE pair_potential_deepmd_copy
1822 SUBROUTINE pair_potential_deepmd_clean(deepmd)
1825 IF (.NOT.
ASSOCIATED(deepmd))
RETURN
1827 END SUBROUTINE pair_potential_deepmd_clean
1834 SUBROUTINE pair_potential_deepmd_release(deepmd)
1837 IF (
ASSOCIATED(deepmd))
THEN
1840 END SUBROUTINE pair_potential_deepmd_release
1847 SUBROUTINE pair_potential_nequip_create(nequip)
1850 cpassert(.NOT.
ASSOCIATED(nequip))
1852 END SUBROUTINE pair_potential_nequip_create
1860 SUBROUTINE pair_potential_nequip_copy(nequip_source, nequip_dest)
1863 IF (.NOT.
ASSOCIATED(nequip_source))
RETURN
1864 IF (
ASSOCIATED(nequip_dest))
CALL pair_potential_nequip_release(nequip_dest)
1865 CALL pair_potential_nequip_create(nequip_dest)
1866 nequip_dest = nequip_source
1868 END SUBROUTINE pair_potential_nequip_copy
1875 SUBROUTINE pair_potential_nequip_clean(nequip)
1878 IF (.NOT.
ASSOCIATED(nequip))
RETURN
1881 END SUBROUTINE pair_potential_nequip_clean
1888 SUBROUTINE pair_potential_nequip_release(nequip)
1891 IF (
ASSOCIATED(nequip))
THEN
1894 END SUBROUTINE pair_potential_nequip_release
1901 SUBROUTINE pair_potential_allegro_create(allegro)
1904 cpassert(.NOT.
ASSOCIATED(allegro))
1906 END SUBROUTINE pair_potential_allegro_create
1914 SUBROUTINE pair_potential_allegro_copy(allegro_source, allegro_dest)
1917 IF (.NOT.
ASSOCIATED(allegro_source))
RETURN
1918 IF (
ASSOCIATED(allegro_dest))
CALL pair_potential_allegro_release(allegro_dest)
1919 CALL pair_potential_allegro_create(allegro_dest)
1920 allegro_dest = allegro_source
1921 END SUBROUTINE pair_potential_allegro_copy
1928 SUBROUTINE pair_potential_allegro_clean(allegro)
1931 IF (.NOT.
ASSOCIATED(allegro))
RETURN
1934 END SUBROUTINE pair_potential_allegro_clean
1941 SUBROUTINE pair_potential_allegro_release(allegro)
1944 IF (
ASSOCIATED(allegro))
THEN
1945 DEALLOCATE (allegro)
1947 END SUBROUTINE pair_potential_allegro_release
1954 SUBROUTINE pair_potential_bmhft_create(ft)
1957 cpassert(.NOT.
ASSOCIATED(ft))
1959 CALL pair_potential_bmhft_clean(ft)
1960 END SUBROUTINE pair_potential_bmhft_create
1968 SUBROUTINE pair_potential_bmhft_copy(ft_source, ft_dest)
1971 IF (.NOT.
ASSOCIATED(ft_source))
RETURN
1972 IF (
ASSOCIATED(ft_dest))
CALL pair_potential_bmhft_release(ft_dest)
1973 CALL pair_potential_bmhft_create(ft_dest)
1974 ft_dest%A = ft_source%A
1975 ft_dest%B = ft_source%B
1976 ft_dest%C = ft_source%C
1977 ft_dest%D = ft_source%D
1978 END SUBROUTINE pair_potential_bmhft_copy
1985 SUBROUTINE pair_potential_bmhft_clean(ft)
1988 IF (.NOT.
ASSOCIATED(ft))
RETURN
1993 END SUBROUTINE pair_potential_bmhft_clean
2000 SUBROUTINE pair_potential_bmhft_release(ft)
2003 IF (
ASSOCIATED(ft))
THEN
2007 END SUBROUTINE pair_potential_bmhft_release
2014 SUBROUTINE pair_potential_bmhftd_create(ftd)
2015 TYPE(ftd_pot_type),
POINTER :: ftd
2017 cpassert(.NOT.
ASSOCIATED(ftd))
2019 CALL pair_potential_bmhftd_clean(ftd)
2020 END SUBROUTINE pair_potential_bmhftd_create
2028 SUBROUTINE pair_potential_bmhftd_copy(ftd_source, ftd_dest)
2029 TYPE(ftd_pot_type),
POINTER :: ftd_source, ftd_dest
2031 IF (.NOT.
ASSOCIATED(ftd_source))
RETURN
2032 IF (
ASSOCIATED(ftd_dest))
CALL pair_potential_bmhftd_release(ftd_dest)
2033 CALL pair_potential_bmhftd_create(ftd_dest)
2034 ftd_dest%A = ftd_source%A
2035 ftd_dest%B = ftd_source%B
2036 ftd_dest%C = ftd_source%C
2037 ftd_dest%D = ftd_source%D
2038 ftd_dest%BD = ftd_source%BD
2039 END SUBROUTINE pair_potential_bmhftd_copy
2046 SUBROUTINE pair_potential_bmhftd_clean(ftd)
2047 TYPE(ftd_pot_type),
POINTER :: ftd
2049 IF (.NOT.
ASSOCIATED(ftd))
RETURN
2055 END SUBROUTINE pair_potential_bmhftd_clean
2062 SUBROUTINE pair_potential_bmhftd_release(ftd)
2063 TYPE(ftd_pot_type),
POINTER :: ftd
2065 IF (
ASSOCIATED(ftd))
THEN
2069 END SUBROUTINE pair_potential_bmhftd_release
2076 SUBROUTINE pair_potential_ipbv_create(ipbv)
2079 cpassert(.NOT.
ASSOCIATED(ipbv))
2081 CALL pair_potential_ipbv_clean(ipbv)
2082 END SUBROUTINE pair_potential_ipbv_create
2090 SUBROUTINE pair_potential_ipbv_copy(ipbv_source, ipbv_dest)
2093 IF (.NOT.
ASSOCIATED(ipbv_source))
RETURN
2094 IF (
ASSOCIATED(ipbv_dest))
CALL pair_potential_ipbv_release(ipbv_dest)
2095 CALL pair_potential_ipbv_create(ipbv_dest)
2096 ipbv_dest%a = ipbv_source%a
2097 ipbv_dest%rcore = ipbv_source%rcore
2098 ipbv_dest%b = ipbv_source%b
2099 ipbv_dest%m = ipbv_source%m
2100 END SUBROUTINE pair_potential_ipbv_copy
2107 SUBROUTINE pair_potential_ipbv_clean(ipbv)
2110 IF (.NOT.
ASSOCIATED(ipbv))
RETURN
2115 END SUBROUTINE pair_potential_ipbv_clean
2122 SUBROUTINE pair_potential_ipbv_release(ipbv)
2125 IF (
ASSOCIATED(ipbv))
THEN
2129 END SUBROUTINE pair_potential_ipbv_release
2136 SUBROUTINE pair_potential_buck4r_create(buck4r)
2137 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2139 cpassert(.NOT.
ASSOCIATED(buck4r))
2141 CALL pair_potential_buck4r_clean(buck4r)
2142 END SUBROUTINE pair_potential_buck4r_create
2150 SUBROUTINE pair_potential_buck4r_copy(buck4r_source, buck4r_dest)
2151 TYPE(buck4ran_pot_type),
POINTER :: buck4r_source, buck4r_dest
2153 IF (.NOT.
ASSOCIATED(buck4r_source))
RETURN
2154 IF (
ASSOCIATED(buck4r_dest))
CALL pair_potential_buck4r_release(buck4r_dest)
2155 CALL pair_potential_buck4r_create(buck4r_dest)
2156 buck4r_dest%a = buck4r_source%a
2157 buck4r_dest%b = buck4r_source%b
2158 buck4r_dest%c = buck4r_source%c
2159 buck4r_dest%r1 = buck4r_source%r1
2160 buck4r_dest%r2 = buck4r_source%r2
2161 buck4r_dest%r3 = buck4r_source%r3
2162 buck4r_dest%poly1 = buck4r_source%poly1
2163 buck4r_dest%poly2 = buck4r_source%poly2
2164 buck4r_dest%npoly1 = buck4r_source%npoly1
2165 buck4r_dest%npoly2 = buck4r_source%npoly2
2166 END SUBROUTINE pair_potential_buck4r_copy
2173 SUBROUTINE pair_potential_buck4r_clean(buck4r)
2174 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2176 IF (.NOT.
ASSOCIATED(buck4r))
RETURN
2183 buck4r%poly1 = 0.0_dp
2185 buck4r%poly2 = 0.0_dp
2187 END SUBROUTINE pair_potential_buck4r_clean
2194 SUBROUTINE pair_potential_buck4r_release(buck4r)
2195 TYPE(buck4ran_pot_type),
POINTER :: buck4r
2197 IF (
ASSOCIATED(buck4r))
THEN
2201 END SUBROUTINE pair_potential_buck4r_release
2208 SUBROUTINE pair_potential_buckmo_create(buckmo)
2209 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2211 cpassert(.NOT.
ASSOCIATED(buckmo))
2213 CALL pair_potential_buckmo_clean(buckmo)
2214 END SUBROUTINE pair_potential_buckmo_create
2222 SUBROUTINE pair_potential_buckmo_copy(buckmo_source, buckmo_dest)
2223 TYPE(buckmorse_pot_type),
POINTER :: buckmo_source, buckmo_dest
2225 IF (.NOT.
ASSOCIATED(buckmo_source))
RETURN
2226 IF (
ASSOCIATED(buckmo_dest))
CALL pair_potential_buckmo_release(buckmo_dest)
2227 CALL pair_potential_buckmo_create(buckmo_dest)
2228 buckmo_dest%f0 = buckmo_source%f0
2229 buckmo_dest%a1 = buckmo_source%a1
2230 buckmo_dest%a2 = buckmo_source%a2
2231 buckmo_dest%b1 = buckmo_source%b1
2232 buckmo_dest%b2 = buckmo_source%b2
2233 buckmo_dest%c = buckmo_source%c
2234 buckmo_dest%d = buckmo_source%d
2235 buckmo_dest%r0 = buckmo_source%r0
2236 buckmo_dest%beta = buckmo_source%beta
2237 END SUBROUTINE pair_potential_buckmo_copy
2244 SUBROUTINE pair_potential_buckmo_clean(buckmo)
2245 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2247 IF (.NOT.
ASSOCIATED(buckmo))
RETURN
2256 buckmo%beta = 0.0_dp
2257 END SUBROUTINE pair_potential_buckmo_clean
2264 SUBROUTINE pair_potential_buckmo_release(buckmo)
2265 TYPE(buckmorse_pot_type),
POINTER :: buckmo
2267 IF (
ASSOCIATED(buckmo))
THEN
2271 END SUBROUTINE pair_potential_buckmo_release
2278 SUBROUTINE pair_potential_tersoff_create(tersoff)
2281 cpassert(.NOT.
ASSOCIATED(tersoff))
2283 CALL pair_potential_tersoff_clean(tersoff)
2284 END SUBROUTINE pair_potential_tersoff_create
2292 SUBROUTINE pair_potential_tersoff_copy(tersoff_source, tersoff_dest)
2295 IF (.NOT.
ASSOCIATED(tersoff_source))
RETURN
2296 IF (
ASSOCIATED(tersoff_dest))
CALL pair_potential_tersoff_release(tersoff_dest)
2297 CALL pair_potential_tersoff_create(tersoff_dest)
2298 tersoff_dest%A = tersoff_source%A
2299 tersoff_dest%B = tersoff_source%B
2300 tersoff_dest%lambda1 = tersoff_source%lambda1
2301 tersoff_dest%lambda2 = tersoff_source%lambda2
2302 tersoff_dest%alpha = tersoff_source%alpha
2303 tersoff_dest%beta = tersoff_source%beta
2304 tersoff_dest%n = tersoff_source%n
2305 tersoff_dest%c = tersoff_source%c
2306 tersoff_dest%d = tersoff_source%d
2307 tersoff_dest%h = tersoff_source%h
2308 tersoff_dest%lambda3 = tersoff_source%lambda3
2309 tersoff_dest%bigR = tersoff_source%bigR
2310 tersoff_dest%bigD = tersoff_source%bigD
2311 tersoff_dest%rcutsq = tersoff_source%rcutsq
2312 END SUBROUTINE pair_potential_tersoff_copy
2319 SUBROUTINE pair_potential_tersoff_clean(tersoff)
2322 IF (.NOT.
ASSOCIATED(tersoff))
RETURN
2325 tersoff%lambda1 = 0.0_dp
2326 tersoff%lambda2 = 0.0_dp
2327 tersoff%alpha = 0.0_dp
2328 tersoff%beta = 0.0_dp
2333 tersoff%lambda3 = 0.0_dp
2334 tersoff%bigR = 0.0_dp
2335 tersoff%bigD = 0.0_dp
2336 tersoff%rcutsq = 0.0_dp
2337 END SUBROUTINE pair_potential_tersoff_clean
2344 SUBROUTINE pair_potential_tersoff_release(tersoff)
2347 IF (
ASSOCIATED(tersoff))
THEN
2348 DEALLOCATE (tersoff)
2351 END SUBROUTINE pair_potential_tersoff_release
2358 SUBROUTINE pair_potential_siepmann_create(siepmann)
2361 cpassert(.NOT.
ASSOCIATED(siepmann))
2363 CALL pair_potential_siepmann_clean(siepmann)
2364 END SUBROUTINE pair_potential_siepmann_create
2371 SUBROUTINE pair_potential_siepmann_copy(siepmann_source, siepmann_dest)
2374 IF (.NOT.
ASSOCIATED(siepmann_source))
RETURN
2375 IF (
ASSOCIATED(siepmann_dest))
CALL pair_potential_siepmann_release(siepmann_dest)
2376 CALL pair_potential_siepmann_create(siepmann_dest)
2377 siepmann_dest%B = siepmann_source%B
2378 siepmann_dest%D = siepmann_source%D
2379 siepmann_dest%E = siepmann_source%E
2380 siepmann_dest%F = siepmann_source%F
2381 siepmann_dest%beta = siepmann_source%beta
2382 siepmann_dest%rcutsq = siepmann_source%rcutsq
2383 siepmann_dest%allow_oh_formation = siepmann_source%allow_oh_formation
2384 siepmann_dest%allow_h3o_formation = siepmann_source%allow_h3o_formation
2385 siepmann_dest%allow_o_formation = siepmann_source%allow_o_formation
2387 END SUBROUTINE pair_potential_siepmann_copy
2394 SUBROUTINE pair_potential_siepmann_clean(siepmann)
2397 IF (.NOT.
ASSOCIATED(siepmann))
RETURN
2402 siepmann%beta = 0.0_dp
2403 siepmann%rcutsq = 0.0_dp
2404 siepmann%allow_oh_formation = .false.
2405 siepmann%allow_h3o_formation = .false.
2406 siepmann%allow_o_formation = .false.
2408 END SUBROUTINE pair_potential_siepmann_clean
2415 SUBROUTINE pair_potential_siepmann_release(siepmann)
2418 IF (
ASSOCIATED(siepmann))
THEN
2419 DEALLOCATE (siepmann)
2422 END SUBROUTINE pair_potential_siepmann_release
2429 SUBROUTINE pair_potential_gal_create(gal)
2432 cpassert(.NOT.
ASSOCIATED(gal))
2434 CALL pair_potential_gal_clean(gal)
2435 END SUBROUTINE pair_potential_gal_create
2443 SUBROUTINE pair_potential_gal_copy(gal_source, gal_dest)
2446 IF (.NOT.
ASSOCIATED(gal_source))
RETURN
2447 IF (
ASSOCIATED(gal_dest))
CALL pair_potential_gal_release(gal_dest)
2448 CALL pair_potential_gal_create(gal_dest)
2449 gal_dest%met1 = gal_source%met1
2450 gal_dest%met2 = gal_source%met2
2451 gal_dest%epsilon = gal_source%epsilon
2452 gal_dest%bxy = gal_source%bxy
2453 gal_dest%bz = gal_source%bz
2454 gal_dest%r1 = gal_source%r1
2455 gal_dest%r2 = gal_source%r2
2456 gal_dest%a1 = gal_source%a1
2457 gal_dest%a2 = gal_source%a2
2458 gal_dest%a3 = gal_source%a3
2459 gal_dest%a4 = gal_source%a4
2460 gal_dest%a = gal_source%a
2461 gal_dest%b = gal_source%b
2462 gal_dest%c = gal_source%c
2463 ALLOCATE (gal_dest%gcn(
SIZE(gal_source%gcn)))
2464 gal_dest%gcn = gal_source%gcn
2465 gal_dest%express = gal_source%express
2466 gal_dest%rcutsq = gal_source%rcutsq
2468 END SUBROUTINE pair_potential_gal_copy
2475 SUBROUTINE pair_potential_gal_clean(gal)
2478 IF (.NOT.
ASSOCIATED(gal))
RETURN
2479 gal%epsilon = 0.0_dp
2492 gal%express = .false.
2494 END SUBROUTINE pair_potential_gal_clean
2501 SUBROUTINE pair_potential_gal_release(gal)
2504 IF (
ASSOCIATED(gal))
THEN
2505 DEALLOCATE (gal%gcn)
2509 END SUBROUTINE pair_potential_gal_release
2516 SUBROUTINE pair_potential_gal21_create(gal21)
2519 cpassert(.NOT.
ASSOCIATED(gal21))
2521 CALL pair_potential_gal21_clean(gal21)
2522 END SUBROUTINE pair_potential_gal21_create
2530 SUBROUTINE pair_potential_gal21_copy(gal21_source, gal21_dest)
2533 IF (.NOT.
ASSOCIATED(gal21_source))
RETURN
2534 IF (
ASSOCIATED(gal21_dest))
CALL pair_potential_gal21_release(gal21_dest)
2535 CALL pair_potential_gal21_create(gal21_dest)
2536 gal21_dest%met1 = gal21_source%met1
2537 gal21_dest%met2 = gal21_source%met2
2538 gal21_dest%epsilon1 = gal21_source%epsilon1
2539 gal21_dest%epsilon2 = gal21_source%epsilon2
2540 gal21_dest%epsilon3 = gal21_source%epsilon3
2541 gal21_dest%bxy1 = gal21_source%bxy1
2542 gal21_dest%bxy2 = gal21_source%bxy2
2543 gal21_dest%bz1 = gal21_source%bz1
2544 gal21_dest%bz2 = gal21_source%bz2
2545 gal21_dest%r1 = gal21_source%r1
2546 gal21_dest%r2 = gal21_source%r2
2547 gal21_dest%a11 = gal21_source%a11
2548 gal21_dest%a12 = gal21_source%a12
2549 gal21_dest%a13 = gal21_source%a13
2550 gal21_dest%a21 = gal21_source%a21
2551 gal21_dest%a22 = gal21_source%a22
2552 gal21_dest%a23 = gal21_source%a23
2553 gal21_dest%a31 = gal21_source%a31
2554 gal21_dest%a32 = gal21_source%a32
2555 gal21_dest%a33 = gal21_source%a33
2556 gal21_dest%a41 = gal21_source%a41
2557 gal21_dest%a42 = gal21_source%a42
2558 gal21_dest%a43 = gal21_source%a43
2559 gal21_dest%AO1 = gal21_source%AO1
2560 gal21_dest%AO2 = gal21_source%AO2
2561 gal21_dest%BO1 = gal21_source%BO1
2562 gal21_dest%BO2 = gal21_source%BO2
2563 gal21_dest%c = gal21_source%c
2564 gal21_dest%AH1 = gal21_source%AH1
2565 gal21_dest%AH2 = gal21_source%AH2
2566 gal21_dest%BH1 = gal21_source%BH1
2567 gal21_dest%BH2 = gal21_source%BH2
2568 ALLOCATE (gal21_dest%gcn(
SIZE(gal21_source%gcn)))
2569 gal21_dest%gcn = gal21_source%gcn
2570 gal21_dest%express = gal21_source%express
2571 gal21_dest%rcutsq = gal21_source%rcutsq
2573 END SUBROUTINE pair_potential_gal21_copy
2580 SUBROUTINE pair_potential_gal21_clean(gal21)
2583 IF (.NOT.
ASSOCIATED(gal21))
RETURN
2584 gal21%epsilon1 = 0.0_dp
2585 gal21%epsilon2 = 0.0_dp
2586 gal21%epsilon3 = 0.0_dp
2614 gal21%rcutsq = 0.0_dp
2615 gal21%express = .false.
2617 END SUBROUTINE pair_potential_gal21_clean
2624 SUBROUTINE pair_potential_gal21_release(gal21)
2627 IF (
ASSOCIATED(gal21))
THEN
2628 DEALLOCATE (gal21%gcn)
2632 END SUBROUTINE pair_potential_gal21_release
2639 SUBROUTINE pair_potential_tab_create(tab)
2642 cpassert(.NOT.
ASSOCIATED(tab))
2644 NULLIFY (tab%r, tab%e, tab%f)
2645 CALL pair_potential_tab_clean(tab)
2646 END SUBROUTINE pair_potential_tab_create
2653 SUBROUTINE pair_potential_tab_copy(tab_source, tab_dest)
2656 IF (.NOT.
ASSOCIATED(tab_source))
RETURN
2657 IF (
ASSOCIATED(tab_dest))
CALL pair_potential_tab_release(tab_dest)
2658 CALL pair_potential_tab_create(tab_dest)
2659 tab_dest%tabpot_file_name = tab_source%tabpot_file_name
2660 tab_dest%dr = tab_source%dr
2661 tab_dest%rcut = tab_source%rcut
2662 tab_dest%npoints = tab_source%npoints
2663 tab_dest%index = tab_source%index
2665 CALL reallocate(tab_dest%r, 1, tab_dest%npoints)
2666 CALL reallocate(tab_dest%e, 1, tab_dest%npoints)
2667 CALL reallocate(tab_dest%f, 1, tab_dest%npoints)
2668 tab_dest%r = tab_source%r
2669 tab_dest%e = tab_source%e
2670 tab_dest%f = tab_source%f
2671 END SUBROUTINE pair_potential_tab_copy
2677 SUBROUTINE pair_potential_tab_clean(tab)
2680 IF (.NOT.
ASSOCIATED(tab))
RETURN
2681 tab%tabpot_file_name =
'NULL'
2690 END SUBROUTINE pair_potential_tab_clean
2696 SUBROUTINE pair_potential_tab_release(tab)
2699 IF (
ASSOCIATED(tab))
THEN
2700 IF (
ASSOCIATED(tab%r))
THEN
2703 IF (
ASSOCIATED(tab%e))
THEN
2706 IF (
ASSOCIATED(tab%f))
THEN
2711 END SUBROUTINE pair_potential_tab_release
Interface to ACE C wrapper.
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
subroutine, public pair_potential_reallocate(p, lb1_new, ub1_new, lj, lj_charmm, williams, goodwin, eam, nequip, allegro, bmhft, bmhftd, ipbv, buck4r, buckmo, gp, tersoff, siepmann, gal, gal21, tab, deepmd, ace)
Cleans the potential parameter 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 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, parameter, public ace_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
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