150#include "./base/base_uses.f90"
155 LOGICAL,
PRIVATE,
PARAMETER :: debug_this_module = .true.
156 CHARACTER(len=*),
PARAMETER,
PRIVATE :: moduleN =
'f77_interface'
160 TYPE(f_env_type),
POINTER :: f_env => null()
161 END TYPE f_env_p_type
170 CHARACTER(len=default_path_length) :: my_path =
"", old_path =
""
173 TYPE(f_env_p_type),
DIMENSION(:),
POINTER,
SAVE ::
f_envs
175 LOGICAL,
SAVE :: module_initialized = .false.
176 INTEGER,
SAVE :: last_f_env_id = 0, n_f_envs = 0
196 FUNCTION get_pos_of_env(env_id)
RESULT(res)
197 INTEGER,
INTENT(in) :: env_id
200 INTEGER :: env_pos, isub
203 DO isub = 1, n_f_envs
204 IF (
f_envs(isub)%f_env%id_nr == env_id)
THEN
209 END FUNCTION get_pos_of_env
221 LOGICAL,
INTENT(in) :: init_mpi
222 INTEGER,
INTENT(out) :: ierr
225 INTEGER :: offload_device_count, unit_nr
226 INTEGER,
POINTER :: active_device_id
227 INTEGER,
TARGET :: offload_chosen_device
230 IF (.NOT. module_initialized)
THEN
253 IF (
PRESENT(mpi_comm))
THEN
272 default_global_unit_nr=unit_nr, &
273 close_global_unit_on_dealloc=.false.)
278 module_initialized = .true.
287 NULLIFY (active_device_id)
291 IF (offload_device_count > 0)
THEN
294 active_device_id => offload_chosen_device
301 accdrv_active_device_id=active_device_id)
322 LOGICAL,
INTENT(in) :: finalize_mpi
323 INTEGER,
INTENT(out) :: ierr
331 IF (.NOT. module_initialized)
THEN
334 DO ienv = n_f_envs, 1, -1
347 CALL dbcsr_finalize_lib()
361 IF (finalize_mpi)
THEN
374 RECURSIVE SUBROUTINE f_env_dealloc(f_env)
379 cpassert(
ASSOCIATED(f_env))
384 IF (f_env%old_path /= f_env%my_path)
THEN
385 CALL m_chdir(f_env%old_path, ierr)
388 END SUBROUTINE f_env_dealloc
401 SUBROUTINE f_env_create(f_env, force_env, timer_env, mp_perf_env, id_nr, logger, old_dir)
406 INTEGER,
INTENT(in) :: id_nr
408 CHARACTER(len=*),
INTENT(in) :: old_dir
411 f_env%force_env => force_env
413 f_env%logger => logger
415 f_env%timer_env => timer_env
421 f_env%old_path = old_dir
422 END SUBROUTINE f_env_create
430 INTEGER,
INTENT(in) :: f_env_id
436 f_env_pos = get_pos_of_env(f_env_id)
437 IF (f_env_pos < 1)
THEN
440 f_env =>
f_envs(f_env_pos)%f_env
461 INTEGER,
INTENT(in) :: f_env_id
463 INTEGER,
INTENT(out),
OPTIONAL :: handle
465 INTEGER :: f_env_pos, ierr
469 f_env_pos = get_pos_of_env(f_env_id)
470 IF (f_env_pos < 1)
THEN
473 f_env =>
f_envs(f_env_pos)%f_env
474 logger => f_env%logger
475 cpassert(
ASSOCIATED(logger))
477 IF (f_env%old_path /= f_env%my_path)
THEN
478 CALL m_chdir(trim(f_env%my_path), ierr)
506 INTEGER,
INTENT(out),
OPTIONAL :: ierr
507 INTEGER,
INTENT(in),
OPTIONAL :: handle
514 IF (
ASSOCIATED(f_env))
THEN
515 IF (
PRESENT(handle))
THEN
519 logger => f_env%logger
523 cpassert(
ASSOCIATED(logger))
524 cpassert(
ASSOCIATED(d_logger))
525 cpassert(
ASSOCIATED(d_timer_env))
526 cpassert(
ASSOCIATED(d_mp_perf_env))
527 cpassert(
ASSOCIATED(logger, d_logger))
529 cpassert(
ASSOCIATED(d_mp_perf_env, f_env%mp_perf_env))
530 IF (f_env%old_path /= f_env%my_path)
THEN
531 CALL m_chdir(trim(f_env%old_path), ierr2)
534 IF (
PRESENT(ierr))
THEN
541 IF (
PRESENT(ierr))
THEN
575 output_path, mpi_comm, output_unit, owns_out_unit, &
576 input, ierr, work_dir, initial_variables)
577 INTEGER,
INTENT(out) :: new_env_id
579 CHARACTER(len=*),
INTENT(in) :: input_path
580 CHARACTER(len=*),
INTENT(in),
OPTIONAL :: output_path
583 INTEGER,
INTENT(in),
OPTIONAL :: output_unit
584 LOGICAL,
INTENT(in),
OPTIONAL :: owns_out_unit
586 INTEGER,
INTENT(out),
OPTIONAL :: ierr
587 CHARACTER(len=*),
INTENT(in),
OPTIONAL :: work_dir
588 CHARACTER(len=*),
DIMENSION(:, :),
OPTIONAL :: initial_variables
590 CHARACTER(len=*),
PARAMETER :: routinen =
'create_force_env'
592 CHARACTER(len=default_path_length) :: old_dir, wdir
593 INTEGER :: handle, i, ierr2, iforce_eval, isubforce_eval, k, method_name_id, my_group, &
594 nforce_eval, ngroups, nsubforce_size, unit_nr
595 INTEGER,
DIMENSION(:),
POINTER :: group_distribution, i_force_eval, &
597 LOGICAL :: check, do_qmmm_force_mixing, multiple_subsys, my_owns_out_unit, &
598 use_motion_section, use_multiple_para_env
604 TYPE(f_env_p_type),
DIMENSION(:),
POINTER :: f_envs_old
606 TYPE(
fp_type),
POINTER :: fp_env
619 TYPE(
section_vals_type),
POINTER :: fe_section, force_env_section, force_env_sections, &
620 fp_section, input_file, qmmm_section, qmmmx_section, root_section, subsys_section, &
624 cpassert(
ASSOCIATED(input_declaration))
625 NULLIFY (para_env, force_env, timer_env,
mp_perf_env, globenv, meta_env, &
626 fp_env, eip_env, pwdft_env, mixed_env, qs_env, qmmm_env, embed_env)
628 IF (
PRESENT(mpi_comm))
THEN
633 CALL para_env%retain()
640 IF (
PRESENT(work_dir))
THEN
641 IF (work_dir /=
" ")
THEN
644 IF (
PRESENT(ierr)) ierr = ierr2
651 IF (
PRESENT(output_unit))
THEN
652 unit_nr = output_unit
654 IF (para_env%is_source())
THEN
655 IF (output_path ==
"__STD_OUT__")
THEN
659 file_status=
"UNKNOWN", &
660 file_action=
"WRITE", &
661 file_position=
"APPEND", &
670 IF (
PRESENT(owns_out_unit)) my_owns_out_unit = owns_out_unit
672 CALL cp2k_init(para_env, output_unit=unit_nr, globenv=globenv, input_file_name=input_path, &
679 IF (
PRESENT(input)) input_file => input
680 IF (.NOT.
ASSOCIATED(input_file))
THEN
681 IF (
PRESENT(initial_variables))
THEN
682 input_file =>
read_input(input_declaration, input_path, initial_variables, para_env=para_env)
684 input_file =>
read_input(input_declaration, input_path, empty_initial_variables, para_env=para_env)
690 CALL check_cp2k_input(input_declaration, input_file, para_env=para_env, output_unit=unit_nr)
692 root_section => input_file
695 IF (n_f_envs + 1 >
SIZE(
f_envs))
THEN
697 ALLOCATE (
f_envs(n_f_envs + 10))
699 f_envs(i)%f_env => f_envs_old(i)%f_env
701 DO i = n_f_envs + 1,
SIZE(
f_envs)
704 DEALLOCATE (f_envs_old)
707 CALL cp2k_read(root_section, para_env, globenv)
709 CALL cp2k_setup(root_section, para_env, globenv)
711 ALLOCATE (group_distribution(0:para_env%num_pe - 1))
712 group_distribution = 0
713 lgroup_distribution => group_distribution
717 l_val=multiple_subsys)
718 CALL multiple_fe_list(force_env_sections, root_section, i_force_eval, nforce_eval)
720 IF (.NOT. multiple_subsys)
THEN
721 DO iforce_eval = 2, nforce_eval
723 i_rep_section=i_force_eval(iforce_eval))
727 nsubforce_size = nforce_eval - 1
728 use_multiple_para_env = .false.
729 use_motion_section = .true.
730 DO iforce_eval = 1, nforce_eval
731 NULLIFY (force_env_section, my_force_env, subsys_section)
733 IF (.NOT. multiple_subsys)
THEN
735 i_rep_section=i_force_eval(1))
738 IF (use_multiple_para_env)
THEN
741 i_rep_section=i_force_eval(1))
744 "In case of multiple force_eval the MAIN force_eval (the first in the list of FORCE_EVAL_ORDER or "// &
745 "the one omitted from that order list) must be a MIXED_ENV type calculation. Please check your "// &
746 "input file and possibly correct the MULTIPLE_FORCE_EVAL%FORCE_EVAL_ORDER. ")
748 IF (method_name_id ==
do_mixed)
THEN
749 check =
ASSOCIATED(force_env%mixed_env%sub_para_env)
751 ngroups = force_env%mixed_env%ngroups
752 my_group = lgroup_distribution(para_env%mepos)
753 isubforce_eval = iforce_eval - 1
755 IF (
modulo(isubforce_eval - 1, ngroups) /= my_group) cycle
756 my_para_env => force_env%mixed_env%sub_para_env(my_group + 1)%para_env
757 my_logger => force_env%mixed_env%sub_logger(my_group + 1)%p
761 IF (method_name_id ==
do_embed)
THEN
762 check =
ASSOCIATED(force_env%embed_env%sub_para_env)
764 ngroups = force_env%embed_env%ngroups
765 my_group = lgroup_distribution(para_env%mepos)
766 isubforce_eval = iforce_eval - 1
768 IF (
modulo(isubforce_eval - 1, ngroups) /= my_group) cycle
769 my_para_env => force_env%embed_env%sub_para_env(my_group + 1)%para_env
770 my_logger => force_env%embed_env%sub_logger(my_group + 1)%p
775 my_para_env => para_env
781 IF (nforce_eval > 1)
THEN
783 i_force_eval(iforce_eval), i_force_eval(iforce_eval))
784 IF (iforce_eval /= 1) use_motion_section = .false.
786 force_env_section => force_env_sections
787 use_motion_section = .true.
791 IF (method_name_id ==
do_qmmm)
THEN
794 IF (do_qmmm_force_mixing) &
798 SELECT CASE (method_name_id)
801 force_env_section=force_env_section, subsys_section=subsys_section, &
802 use_motion_section=use_motion_section)
807 CALL qs_init(qs_env, my_para_env, root_section, globenv=globenv, force_env_section=force_env_section, &
808 subsys_section=subsys_section, use_motion_section=use_motion_section)
809 CALL force_env_create(my_force_env, root_section, qs_env=qs_env, para_env=my_para_env, globenv=globenv, &
810 force_env_section=force_env_section)
816 force_env_section, qmmm_section, subsys_section, use_motion_section)
817 CALL force_env_create(my_force_env, root_section, qmmm_env=qmmm_env, para_env=my_para_env, &
818 globenv=globenv, force_env_section=force_env_section)
823 force_env_section, subsys_section, use_motion_section)
824 CALL force_env_create(my_force_env, root_section, qmmmx_env=qmmmx_env, para_env=my_para_env, &
825 globenv=globenv, force_env_section=force_env_section)
830 CALL eip_init(eip_env, root_section, my_para_env, force_env_section=force_env_section, &
831 subsys_section=subsys_section)
832 CALL force_env_create(my_force_env, root_section, eip_env=eip_env, para_env=my_para_env, &
833 globenv=globenv, force_env_section=force_env_section)
837 IF (unit_nr > 0)
WRITE (unit=unit_nr, fmt=
"(T2,A)", advance=
"NO")
"SIRIUS| "
842 CALL pwdft_init(pwdft_env, root_section, my_para_env, force_env_section=force_env_section, &
843 subsys_section=subsys_section, use_motion_section=use_motion_section)
844 CALL force_env_create(my_force_env, root_section, pwdft_env=pwdft_env, para_env=my_para_env, &
845 globenv=globenv, force_env_section=force_env_section)
850 force_env_section=force_env_section, n_subforce_eval=nsubforce_size, &
851 use_motion_section=use_motion_section)
852 CALL force_env_create(my_force_env, root_section, mixed_env=mixed_env, para_env=my_para_env, &
853 globenv=globenv, force_env_section=force_env_section)
855 use_multiple_para_env = .true.
857 lgroup_distribution => my_force_env%mixed_env%group_distribution
862 force_env_section=force_env_section, n_subforce_eval=nsubforce_size, &
863 use_motion_section=use_motion_section)
864 CALL force_env_create(my_force_env, root_section, embed_env=embed_env, para_env=my_para_env, &
865 globenv=globenv, force_env_section=force_env_section)
867 use_multiple_para_env = .true.
869 lgroup_distribution => my_force_env%embed_env%group_distribution
873 CALL nnp_init(nnp_env, root_section, my_para_env, force_env_section=force_env_section, &
874 subsys_section=subsys_section, use_motion_section=use_motion_section)
875 CALL force_env_create(my_force_env, root_section, nnp_env=nnp_env, para_env=my_para_env, &
876 globenv=globenv, force_env_section=force_env_section)
880 CALL ipi_init(ipi_env, root_section, my_para_env, force_env_section=force_env_section, &
881 subsys_section=subsys_section)
882 CALL force_env_create(my_force_env, root_section, ipi_env=ipi_env, para_env=my_para_env, &
883 globenv=globenv, force_env_section=force_env_section)
890 "Invalid METHOD <"//trim(
enum_i2c(enum, method_name_id))// &
895 NULLIFY (meta_env, fp_env)
896 IF (use_motion_section)
THEN
899 CALL metadyn_read(meta_env, my_force_env, root_section, my_para_env, fe_section)
910 IF (nforce_eval > 1 .AND. iforce_eval == 1)
THEN
911 ALLOCATE (my_force_env%sub_force_env(nsubforce_size))
913 DO k = 1, nsubforce_size
914 NULLIFY (my_force_env%sub_force_env(k)%force_env)
918 IF (iforce_eval == 1)
THEN
919 force_env => my_force_env
921 force_env%sub_force_env(iforce_eval - 1)%force_env => my_force_env
924 IF (.NOT. use_multiple_para_env)
THEN
925 lgroup_distribution = iforce_eval
930 IF (use_multiple_para_env) &
932 DEALLOCATE (group_distribution)
933 DEALLOCATE (i_force_eval)
936 CALL para_env%max(last_f_env_id)
937 last_f_env_id = last_f_env_id + 1
938 new_env_id = last_f_env_id
939 n_f_envs = n_f_envs + 1
940 CALL f_env_create(
f_envs(n_f_envs)%f_env, logger=logger, &
942 id_nr=last_f_env_id, old_dir=old_dir)
966 INTEGER,
INTENT(in) :: env_id
967 INTEGER,
INTENT(out) :: ierr
968 LOGICAL,
INTENT(IN),
OPTIONAL :: q_finalize
970 INTEGER :: env_pos, i
978 env_pos = get_pos_of_env(env_id)
979 n_f_envs = n_f_envs - 1
980 DO i = env_pos, n_f_envs
983 NULLIFY (
f_envs(n_f_envs + 1)%f_env)
986 root_section=root_section, para_env=para_env)
988 cpassert(
ASSOCIATED(globenv))
989 NULLIFY (f_env%force_env%globenv)
990 CALL f_env_dealloc(f_env)
991 IF (
PRESENT(q_finalize))
THEN
992 CALL cp2k_finalize(root_section, para_env, globenv, f_env%old_path, q_finalize)
994 CALL cp2k_finalize(root_section, para_env, globenv, f_env%old_path)
1012 INTEGER,
INTENT(IN) :: env_id
1013 INTEGER,
INTENT(OUT) :: n_atom, ierr
1035 INTEGER,
INTENT(IN) :: env_id
1036 INTEGER,
INTENT(OUT) :: n_particle, ierr
1058 INTEGER,
INTENT(IN) :: env_id
1059 REAL(kind=
dp),
DIMENSION(3, 3) :: cell
1060 INTEGER,
DIMENSION(3),
OPTIONAL :: per
1061 INTEGER,
INTENT(OUT) :: ierr
1070 cpassert(
ASSOCIATED(cell_full))
1071 cell = cell_full%hmat
1072 IF (
PRESENT(per)) per(:) = cell_full%perd(:)
1086 INTEGER,
INTENT(IN) :: env_id
1087 REAL(kind=
dp),
DIMENSION(3, 3) :: cell
1088 INTEGER,
INTENT(OUT) :: ierr
1098 CALL get_qs_env(qmmm_env%qs_env, cell=cell_qmmm)
1099 cpassert(
ASSOCIATED(cell_qmmm))
1100 cell = cell_qmmm%hmat
1115 SUBROUTINE get_result_r1(env_id, description, N, RESULT, res_exist, ierr)
1117 CHARACTER(LEN=default_string_length) :: description
1119 REAL(kind=
dp),
DIMENSION(1:N) :: result
1120 LOGICAL,
OPTIONAL :: res_exist
1124 LOGICAL :: exist_res
1129 NULLIFY (f_env, subsys, results)
1135 IF (
PRESENT(res_exist))
THEN
1137 exist_res = res_exist
1143 CALL get_results(results, description=description, n_rep=nres)
1144 CALL get_results(results, description=description, values=result, nval=nres)
1149 END SUBROUTINE get_result_r1
1162 INTEGER,
INTENT(IN) :: env_id, n_el
1163 REAL(kind=
dp),
DIMENSION(1:n_el) :: frc
1164 INTEGER,
INTENT(OUT) :: ierr
1184 INTEGER,
INTENT(IN) :: env_id
1185 REAL(kind=
dp),
DIMENSION(3, 3),
INTENT(OUT) :: stress_tensor
1186 INTEGER,
INTENT(OUT) :: ierr
1193 NULLIFY (f_env, subsys, virial, cell)
1194 stress_tensor(:, :) = 0.0_dp
1197 CALL force_env_get(f_env%force_env, subsys=subsys, cell=cell)
1199 IF (virial%pv_availability)
THEN
1200 stress_tensor(:, :) = virial%pv_virial(:, :)/cell%deth
1217 INTEGER,
INTENT(IN) :: env_id, n_el
1218 REAL(kind=
dp),
DIMENSION(1:n_el) :: pos
1219 INTEGER,
INTENT(OUT) :: ierr
1239 SUBROUTINE get_vel(env_id, vel, n_el, ierr)
1241 INTEGER,
INTENT(IN) :: env_id, n_el
1242 REAL(kind=
dp),
DIMENSION(1:n_el) :: vel
1243 INTEGER,
INTENT(OUT) :: ierr
1252 END SUBROUTINE get_vel
1263 INTEGER,
INTENT(IN) :: env_id
1264 REAL(kind=
dp),
DIMENSION(3, 3) :: new_cell
1265 INTEGER,
INTENT(OUT) :: ierr
1271 NULLIFY (f_env, cell, subsys)
1275 cpassert(
ASSOCIATED(cell))
1276 cell%hmat = new_cell
1295 INTEGER,
INTENT(IN) :: env_id, n_el
1296 REAL(kind=
dp),
DIMENSION(1:n_el) :: new_pos
1297 INTEGER,
INTENT(OUT) :: ierr
1322 INTEGER,
INTENT(IN) :: env_id, n_el
1323 REAL(kind=
dp),
DIMENSION(1:n_el) :: new_vel
1324 INTEGER,
INTENT(OUT) :: ierr
1348 INTEGER,
INTENT(in) :: env_id
1350 INTEGER,
INTENT(out) :: ierr
1373 INTEGER,
INTENT(in) :: env_id
1374 REAL(kind=
dp),
INTENT(out) :: e_pot
1375 INTEGER,
INTENT(out) :: ierr
1400 INTEGER,
INTENT(IN) :: env_id, n_el
1401 REAL(kind=
dp),
DIMENSION(1:n_el),
INTENT(IN) :: pos
1402 REAL(kind=
dp),
INTENT(OUT) :: e_pot
1403 INTEGER,
INTENT(OUT) :: ierr
1405 REAL(kind=
dp),
DIMENSION(1) :: dummy_f
1407 CALL calc_force(env_id, pos, n_el, e_pot, dummy_f, 0, ierr)
1428 RECURSIVE SUBROUTINE calc_force(env_id, pos, n_el_pos, e_pot, force, n_el_force, ierr)
1430 INTEGER,
INTENT(in) :: env_id, n_el_pos
1431 REAL(kind=
dp),
DIMENSION(1:n_el_pos),
INTENT(in) :: pos
1432 REAL(kind=
dp),
INTENT(out) :: e_pot
1433 INTEGER,
INTENT(in) :: n_el_force
1434 REAL(kind=
dp),
DIMENSION(1:n_el_force), &
1435 INTENT(inout) :: force
1436 INTEGER,
INTENT(out) :: ierr
1440 calc_f = (n_el_force /= 0)
1441 CALL set_pos(env_id, pos, n_el_pos, ierr)
1443 IF (ierr == 0)
CALL get_energy(env_id, e_pot, ierr)
1444 IF (calc_f .AND. (ierr == 0))
CALL get_force(env_id, force, n_el_force, ierr)
1462 SUBROUTINE check_input(input_declaration, input_file_path, output_file_path, &
1463 echo_input, mpi_comm, initial_variables, ierr)
1465 CHARACTER(len=*),
INTENT(in) :: input_file_path, output_file_path
1466 LOGICAL,
INTENT(in),
OPTIONAL :: echo_input
1468 CHARACTER(len=default_path_length), &
1469 DIMENSION(:, :),
INTENT(IN) :: initial_variables
1470 INTEGER,
INTENT(out) :: ierr
1473 LOGICAL :: my_echo_input
1478 my_echo_input = .false.
1479 IF (
PRESENT(echo_input)) my_echo_input = echo_input
1481 IF (
PRESENT(mpi_comm))
THEN
1486 CALL para_env%retain()
1488 IF (para_env%is_source())
THEN
1489 IF (output_file_path ==
"__STD_OUT__")
THEN
1492 CALL open_file(file_name=output_file_path, file_status=
"UNKNOWN", &
1493 file_action=
"WRITE", file_position=
"APPEND", &
1494 unit_number=unit_nr)
1502 default_global_unit_nr=unit_nr, &
1503 close_global_unit_on_dealloc=.false.)
1507 input_file =>
read_input(input_declaration, input_file_path, initial_variables=initial_variables, &
1509 CALL check_cp2k_input(input_declaration, input_file, para_env=para_env, output_unit=unit_nr)
1510 IF (my_echo_input .AND. (unit_nr > 0))
THEN
1514 hide_defaults=.false.)
static GRID_HOST_DEVICE int modulo(int a, int m)
Equivalent of Fortran's MODULO, which always return a positive number. https://gcc....
void grid_library_finalize(void)
Finalizes the grid library.
void grid_library_init(void)
Initializes the grid library.
Central dispatch for basic hooks.
procedure(cp_warn_interface), pointer, public cp_warn_hook
subroutine, public cp_abort(location, message)
Terminate the program.
subroutine, public timeset(routinen, handle)
Start timer.
procedure(cp_abort_interface), pointer, public cp_abort_hook
procedure(timeset_interface), pointer, public timeset_hook
subroutine, public timestop(handle)
Stop timer.
procedure(timestop_interface), pointer, public timestop_hook
collects all references to literature in CP2K as new algorithms / method are included from literature...
subroutine, public add_all_references()
adds references that can later be cited / printed using the key
Handles all functions related to the CELL.
subroutine, public init_cell(cell, hmat, periodic)
Initialise/readjust a simulation cell after hmat has been changed.
Handles all functions related to the CELL.
some minimal info about CP2K, including its version and license
subroutine, public get_runtime_info()
...
subroutine, public cp_dlaf_finalize()
Finalize DLA-Future and pika runtime.
subroutine, public cp_dlaf_free_all_grids()
Free all DLA-Future grids.
Module that contains the routines for error handling.
subroutine, public cp_error_handling_setup()
Registers handlers with base_hooks.F.
Utility routines to open and close files. Tracking of preconnections.
subroutine, public open_file(file_name, file_status, file_form, file_action, file_position, file_pad, unit_number, debug, skip_get_unit_number, file_access)
Opens the requested file using a free unit number.
subroutine, public init_preconnection_list()
Allocate and initialise the list of preconnected units.
various routines to log and control the output. The idea is that decisions about where to log should ...
subroutine, public cp_rm_default_logger()
the cousin of cp_add_default_logger, decrements the stack, so that the default logger is what it has ...
subroutine, public cp_logger_release(logger)
releases this logger
subroutine, public cp_logger_create(logger, para_env, print_level, default_global_unit_nr, default_local_unit_nr, global_filename, local_filename, close_global_unit_on_dealloc, iter_info, close_local_unit_on_dealloc, suffix, template_logger)
initializes a logger
integer function, public cp_default_logger_stack_size()
...
integer, parameter, public cp_failure_level
subroutine, public cp_logger_retain(logger)
retains the given logger (to be called to keep a shared copy of the logger)
subroutine, public cp_add_default_logger(logger)
adds a default logger. MUST be called before logging occours
type(cp_logger_type) function, pointer, public cp_get_default_logger()
returns the default logger
routines to handle the output, The idea is to remove the decision of wheter to output and what to out...
subroutine, public cp_iterate(iteration_info, last, iter_nr, increment, iter_nr_out)
adds one to the actual iteration
set of type/routines to handle the storage of results in force_envs
logical function, public test_for_result(results, description)
test for a certain result in the result_list
set of type/routines to handle the storage of results in force_envs
types that represent a subsys, i.e. a part of the system
subroutine, public unpack_subsys_particles(subsys, f, r, s, v, fscale, cell)
Unpack components of a subsystem particle sets into a single vector.
subroutine, public cp_subsys_set(subsys, atomic_kinds, particles, local_particles, molecules, molecule_kinds, local_molecules, para_env, colvar_p, shell_particles, core_particles, gci, multipoles, results, cell)
sets various propreties of the subsys
subroutine, public cp_subsys_get(subsys, ref_count, atomic_kinds, atomic_kind_set, particles, particle_set, local_particles, molecules, molecule_set, molecule_kinds, molecule_kind_set, local_molecules, para_env, colvar_p, shell_particles, core_particles, gci, multipoles, natom, nparticle, ncore, nshell, nkind, atprop, virial, results, cell)
returns information about various attributes of the given subsys
subroutine, public dbm_library_init()
Initialize DBM library.
subroutine, public dbm_library_finalize()
Finalize DBM library.
The environment for the empirical interatomic potential methods.
subroutine, public eip_env_create(eip_env)
Creates the eip environment.
Methods and functions on the EIP environment.
subroutine, public eip_init(eip_env, root_section, para_env, force_env_section, subsys_section)
Initialize the eip environment.
Main force create for embedding.
subroutine, public embed_create_force_env(embed_env, root_section, para_env, force_env_section, n_subforce_eval, use_motion_section)
Controls program flow for embedded calculations.
Sets up and terminates the global environment variables.
subroutine, public cp2k_finalize(root_section, para_env, globenv, wdir, q_finalize)
Writes final timings and banner for CP2K.
subroutine, public cp2k_read(root_section, para_env, globenv)
read part of cp2k_init
subroutine, public cp2k_init(para_env, output_unit, globenv, input_file_name, wdir)
Initializes a CP2K run (setting of the global environment variables)
subroutine, public cp2k_setup(root_section, para_env, globenv)
globenv initializations that need the input and error
interface to use cp2k as library
recursive subroutine, public destroy_force_env(env_id, ierr, q_finalize)
deallocates the force_env with the given id
subroutine, public f_env_get_from_id(f_env_id, f_env)
...
subroutine, public set_vel(env_id, new_vel, n_el, ierr)
sets the velocities of the particles
subroutine, public get_nparticle(env_id, n_particle, ierr)
returns the number of particles in the given force env
subroutine, public get_natom(env_id, n_atom, ierr)
returns the number of atoms in the given force env
subroutine, public f_env_add_defaults(f_env_id, f_env, handle)
adds the default environments of the f_env to the stack of the defaults, and returns a new error and ...
subroutine, public get_cell(env_id, cell, per, ierr)
gets a cell
type(mp_para_env_type), pointer, save, public default_para_env
recursive subroutine, public calc_energy_force(env_id, calc_force, ierr)
updates the energy and the forces of given force_env
subroutine, public get_energy(env_id, e_pot, ierr)
returns the energy of the last configuration calculated
subroutine, public init_cp2k(init_mpi, ierr, mpi_comm)
initializes cp2k, needs to be called once before using any of the other functions when using cp2k as ...
subroutine, public get_qmmm_cell(env_id, cell, ierr)
gets the qmmm cell
subroutine, public get_pos(env_id, pos, n_el, ierr)
gets the positions of the particles
type(f_env_p_type), dimension(:), pointer, save f_envs
recursive subroutine, public create_force_env(new_env_id, input_declaration, input_path, output_path, mpi_comm, output_unit, owns_out_unit, input, ierr, work_dir, initial_variables)
creates a new force environment using the given input, and writing the output to the given output uni...
recursive subroutine, public calc_energy(env_id, pos, n_el, e_pot, ierr)
returns the energy of the configuration given by the positions passed as argument
subroutine, public set_cell(env_id, new_cell, ierr)
sets a new cell
subroutine, public finalize_cp2k(finalize_mpi, ierr)
cleanup after you have finished using this interface
subroutine, public set_pos(env_id, new_pos, n_el, ierr)
sets the positions of the particles
subroutine, public get_stress_tensor(env_id, stress_tensor, ierr)
gets the stress tensor
subroutine, public check_input(input_declaration, input_file_path, output_file_path, echo_input, mpi_comm, initial_variables, ierr)
performs a check of the input
subroutine, public f_env_rm_defaults(f_env, ierr, handle)
removes the default environments of the f_env to the stack of the defaults, and sets ierr accordingly...
subroutine, public get_force(env_id, frc, n_el, ierr)
gets the forces of the particles
recursive subroutine, public calc_force(env_id, pos, n_el_pos, e_pot, force, n_el_force, ierr)
returns the energy of the configuration given by the positions passed as argument
perform classical molecular dynamics and path integral simulations
subroutine, public fist_create_force_env(force_env, root_section, para_env, globenv, qmmm, qmmm_env, force_env_section, subsys_section, use_motion_section, prev_subsys)
Controls program flow for classical MD and path-integrals.
Interface for the force calculations.
recursive subroutine, public force_env_calc_energy_force(force_env, calc_force, consistent_energies, skip_external_control, eval_energy_forces, require_consistent_energy_force, linres, calc_stress_tensor)
Interface routine for force and energy calculations.
subroutine, public force_env_create(force_env, root_section, para_env, globenv, fist_env, qs_env, meta_env, sub_force_env, qmmm_env, qmmmx_env, eip_env, pwdft_env, force_env_section, mixed_env, embed_env, nnp_env, ipi_env)
creates and initializes a force environment
Interface for the force calculations.
integer function, public force_env_get_natom(force_env)
returns the number of atoms
subroutine, public force_env_get_vel(force_env, vel, n)
returns the particle velocities in a dimension(*) array
subroutine, public multiple_fe_list(force_env_sections, root_section, i_force_eval, nforce_eval)
returns the order of the multiple force_env
recursive subroutine, public force_env_get(force_env, in_use, fist_env, qs_env, meta_env, fp_env, subsys, para_env, potential_energy, additional_potential, kinetic_energy, harmonic_shell, kinetic_shell, cell, sub_force_env, qmmm_env, qmmmx_env, eip_env, pwdft_env, globenv, input, force_env_section, method_name_id, root_section, mixed_env, nnp_env, embed_env, ipi_env)
returns various attributes about the force environment
subroutine, public force_env_retain(force_env)
retains the given force env
subroutine, public force_env_get_pos(force_env, pos, n)
returns the particle positions in a dimension(*) array
subroutine, public force_env_set(force_env, meta_env, fp_env, force_env_section, method_name_id, additional_potential)
changes some attributes of the force_env
subroutine, public force_env_get_frc(force_env, frc, n)
returns the particle forces in a dimension(*) array
recursive subroutine, public force_env_release(force_env)
releases the given force env
integer function, public force_env_get_nparticle(force_env)
returns the number of particles in a force environment
types used in the flexible partitioning scheme
subroutine, public fp_env_write(fp_env, fp_section)
writes information concerning the fp_env to the output
subroutine, public fp_env_read(fp_env, fp_section)
reads the corresponding input section and stores it in the fp_env
pure subroutine, public fp_env_create(fp_env)
create retain release the flexible partitioning environment
Define type storing the global information of a run. Keep the amount of stored data small....
subroutine, public globenv_create(globenv)
Creates the global environment globenv.
subroutine, public globenv_release(globenv)
Releases the global environment globenv.
Fortran API for the grid package, which is written in C.
The environment for the empirical interatomic potential methods.
Methods and functions on the i–PI environment.
subroutine, public ipi_init(ipi_env, root_section, para_env, force_env_section, subsys_section)
Initialize the ipi environment.
Defines the basic variable types.
integer, parameter, public dp
integer, parameter, public default_string_length
integer, parameter, public default_path_length
Machine interface based on Fortran 2003 and POSIX.
integer, parameter, public default_output_unit
subroutine, public m_memory(mem)
Returns the total amount of memory [bytes] in use, if known, zero otherwise.
subroutine, public m_getcwd(curdir)
...
subroutine, public m_chdir(dir, ierror)
...
Interface to the message passing library MPI.
subroutine, public mp_world_init(mp_comm)
initializes the system default communicator
type(mp_comm_type), parameter, public mp_comm_world
subroutine, public mp_para_env_release(para_env)
releases the para object (to be called when you don't want anymore the shared copy of this object)
subroutine, public mp_world_finalize()
finalizes the system default communicator
perform biased molecular dynamics (H= k H1 + (1-k) H2 [linear or general mixing)
subroutine, public mixed_create_force_env(mixed_env, root_section, para_env, force_env_section, n_subforce_eval, use_motion_section)
Controls program flow for mixed calculations.
Defines all routines to deal with the performance of MPI routines.
subroutine, public mp_perf_env_release(perf_env)
...
subroutine, public rm_mp_perf_env()
...
type(mp_perf_env_type) function, pointer, public get_mp_perf_env()
...
elemental subroutine, public mp_perf_env_retain(perf_env)
...
subroutine, public add_mp_perf_env(perf_env)
start and stop the performance indicators for every call to start there has to be (exactly) one call ...
Data types for neural network potentials.
Methods dealing with Neural Network potentials.
subroutine, public nnp_init(nnp_env, root_section, para_env, force_env_section, subsys_section, use_motion_section)
Read and initialize all the information for neural network potentials.
Fortran API for the offload package, which is written in C.
subroutine, public offload_set_chosen_device(device_id)
Selects the chosen device to be used.
integer function, public offload_get_device_count()
Returns the number of available devices.
subroutine, public offload_init()
Initialize runtime.
Periodic Table related data definitions.
subroutine, public init_periodic_table()
Initialization of Periodic Table related data.
subroutine, public pw_fpga_finalize()
Releases resources on the fpga device.
subroutine, public pw_fpga_init()
Allocates resources on the fpga device.
subroutine, public pw_gpu_init()
Allocates resources on the gpu device for gpu fft acceleration.
subroutine, public pw_gpu_finalize()
Releases resources on the gpu device for gpu fft acceleration.
The type definitions for the PWDFT environment.
subroutine, public pwdft_env_create(pwdft_env)
Creates the pwdft environment.
Methods and functions on the PWDFT environment.
subroutine, public pwdft_init(pwdft_env, root_section, para_env, force_env_section, subsys_section, use_motion_section)
Initialize the pwdft environment.
Initialize a QM/MM calculation.
subroutine, public qmmm_env_create(qmmm_env, root_section, para_env, globenv, force_env_section, qmmm_section, subsys_section, use_motion_section, prev_subsys, ignore_outside_box)
...
Basic container type for QM/MM.
Initialize a QM/MM calculation with Force-Mixing.
subroutine, public qmmmx_env_create(qmmmx_env, root_section, para_env, globenv, force_env_section, subsys_section, use_motion_section)
...
Basic container type for QM/MM with force mixing.
subroutine, public get_qs_env(qs_env, atomic_kind_set, qs_kind_set, cell, super_cell, cell_ref, use_ref_cell, kpoints, dft_control, mos, sab_orb, sab_all, qmmm, qmmm_periodic, sac_ae, sac_ppl, sac_lri, sap_ppnl, sab_vdw, sab_scp, sap_oce, sab_lrc, sab_se, sab_xtbe, sab_tbe, sab_core, sab_xb, sab_xtb_pp, sab_xtb_nonbond, sab_almo, sab_kp, sab_kp_nosym, sab_cneo, particle_set, energy, force, matrix_h, matrix_h_im, matrix_ks, matrix_ks_im, matrix_vxc, run_rtp, rtp, matrix_h_kp, matrix_h_im_kp, matrix_ks_kp, matrix_ks_im_kp, matrix_vxc_kp, kinetic_kp, matrix_s_kp, matrix_w_kp, matrix_s_ri_aux_kp, matrix_s, matrix_s_ri_aux, matrix_w, matrix_p_mp2, matrix_p_mp2_admm, rho, rho_xc, pw_env, ewald_env, ewald_pw, active_space, mpools, input, para_env, blacs_env, scf_control, rel_control, kinetic, qs_charges, vppl, rho_core, rho_nlcc, rho_nlcc_g, ks_env, ks_qmmm_env, wf_history, scf_env, local_particles, local_molecules, distribution_2d, dbcsr_dist, molecule_kind_set, molecule_set, subsys, cp_subsys, oce, local_rho_set, rho_atom_set, task_list, task_list_soft, rho0_atom_set, rho0_mpole, rhoz_set, rhoz_cneo_set, ecoul_1c, rho0_s_rs, rho0_s_gs, rhoz_cneo_s_rs, rhoz_cneo_s_gs, do_kpoints, has_unit_metric, requires_mo_derivs, mo_derivs, mo_loc_history, nkind, natom, nelectron_total, nelectron_spin, efield, neighbor_list_id, linres_control, xas_env, virial, cp_ddapc_env, cp_ddapc_ewald, outer_scf_history, outer_scf_ihistory, x_data, et_coupling, dftb_potential, results, se_taper, se_store_int_env, se_nddo_mpole, se_nonbond_env, admm_env, lri_env, lri_density, exstate_env, ec_env, harris_env, dispersion_env, gcp_env, vee, rho_external, external_vxc, mask, mp2_env, bs_env, kg_env, wanniercentres, atprop, ls_scf_env, do_transport, transport_env, v_hartree_rspace, s_mstruct_changed, rho_changed, potential_changed, forces_up_to_date, mscfg_env, almo_scf_env, gradient_history, variable_history, embed_pot, spin_embed_pot, polar_env, mos_last_converged, eeq, rhs, do_rixs, tb_tblite)
Get the QUICKSTEP environment.
subroutine, public qs_env_create(qs_env, globenv)
allocates and intitializes a qs_env
subroutine, public qs_init(qs_env, para_env, root_section, globenv, cp_subsys, kpoint_env, cell, cell_ref, qmmm, qmmm_env_qm, force_env_section, subsys_section, use_motion_section, silent)
Read the input and the database files for the setup of the QUICKSTEP environment.
provides a uniform framework to add references to CP2K cite and output these
subroutine, public remove_all_references()
deallocate the bibliography
Interface to the SIRIUS Library.
subroutine, public cp_sirius_init()
Empty implementation in case SIRIUS is not compiled in.
logical function, public cp_sirius_is_initialized()
Return always .FALSE. because the Sirius library is not compiled in.
subroutine, public cp_sirius_finalize()
Empty implementation in case SIRIUS is not compiled in.
generates a unique id number for a string (str2id) that can be used two compare two strings....
subroutine, public string_table_deallocate(iw)
deallocates the string table
subroutine, public string_table_allocate()
allocates the string table
Types used by timings.F and timings_report.F Due to the fortran restriction on cicular module-depende...
Timing routines for accounting.
subroutine, public timings_register_hooks()
Registers handlers with base_hooks.F.
type(timer_env_type) function, pointer, public get_timer_env()
returns the current timer env from the stack
subroutine, public add_timer_env(timer_env)
adds the given timer_env to the top of the stack
subroutine, public rm_timer_env()
removes the current timer env from the stack
subroutine, public timer_env_release(timer_env)
releases the given timer env
subroutine, public timer_env_retain(timer_env)
retains the given timer env
Type defining parameters related to the simulation cell.
type of a logger, at the moment it contains just a print level starting at which level it should be l...
contains arbitrary information which need to be stored
represents a system: atoms, molecules, their pos,vel,...
The empirical interatomic potential environment.
Embedding environment type.
wrapper to abstract the force evaluation of the various methods
contains the initially parsed file and the initial parallel environment
stores all the informations relevant to an mpi environment
Main data type collecting all relevant data for neural network potentials.
The PWDFT environment type.