Skip to content

Commit

Permalink
Fixed several formatting errors
Browse files Browse the repository at this point in the history
  • Loading branch information
IlyaFed authored and mkrack committed Nov 16, 2023
1 parent 9d884ae commit 4de6411
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 6 deletions.
1 change: 0 additions & 1 deletion src/qs_loc_methods.F
Original file line number Diff line number Diff line change
Expand Up @@ -150,7 +150,6 @@ MODULE qs_loc_methods
!> \param nmo ...
!> \param vectors_2 ...
!> \param guess_mos ...
!> \param restricted: flag for LOW SPIN ROKS UNMATCHED_PROCEDURE_ARGUMENT: please check
!> \par History
!> 04.2005 created [MI]
!> \author MI
Expand Down
6 changes: 3 additions & 3 deletions src/qs_loc_utils.F
Original file line number Diff line number Diff line change
Expand Up @@ -1048,7 +1048,6 @@ SUBROUTINE qs_loc_init(qs_env, qs_loc_env, localize_section, mos_localized, &
do_homo, do_mo_cubes, mo_loc_history, evals, &
tot_zeff_corr, do_mixed)

TYPE(dft_control_type), POINTER :: dft_control
TYPE(qs_environment_type), POINTER :: qs_env
TYPE(qs_loc_env_type), POINTER :: qs_loc_env
TYPE(section_vals_type), POINTER :: localize_section
Expand All @@ -1071,6 +1070,7 @@ SUBROUTINE qs_loc_init(qs_env, qs_loc_env, localize_section, mos_localized, &
TYPE(cp_fm_type), POINTER :: mo_coeff
TYPE(cp_logger_type), POINTER :: logger
TYPE(dbcsr_p_type), DIMENSION(:), POINTER :: ks_rmpv, mo_derivs
TYPE(dft_control_type), POINTER :: dft_control
TYPE(localized_wfn_control_type), POINTER :: localized_wfn_control
TYPE(mo_set_type), DIMENSION(:), POINTER :: mos
TYPE(mp_para_env_type), POINTER :: para_env
Expand All @@ -1085,7 +1085,7 @@ SUBROUTINE qs_loc_init(qs_env, qs_loc_env, localize_section, mos_localized, &
matrix_ks=ks_rmpv, &
mo_derivs=mo_derivs, &
scf_control=scf_control, &
dft_control=dft_control,&
dft_control=dft_control, &
para_env=para_env)

loc_print_section => section_vals_get_subs_vals(localize_section, "PRINT")
Expand Down Expand Up @@ -1166,7 +1166,7 @@ SUBROUTINE qs_loc_init(qs_env, qs_loc_env, localize_section, mos_localized, &
! Get eigenstates (only needed if not already calculated before)
IF ((.NOT. my_do_mo_cubes) &
! .OR. section_get_ival(dft_section,"PRINT%MO_CUBES%NHOMO")==0)&
.AND. my_do_homo .AND. qs_env%scf_env%method == ot_method_nr .AND. (.NOT.dft_control%restricted)) THEN
.AND. my_do_homo .AND. qs_env%scf_env%method == ot_method_nr .AND. (.NOT. dft_control%restricted)) THEN
CALL make_mo_eig(mos, nspin, ks_rmpv, scf_control, mo_derivs)
END IF
IF (localized_wfn_control%set_of_states == state_loc_all .AND. my_do_homo) THEN
Expand Down
2 changes: 0 additions & 2 deletions src/qs_localization_methods.F
Original file line number Diff line number Diff line change
Expand Up @@ -291,7 +291,6 @@ END SUBROUTINE initialize_weights
!> \param target_time ...
!> \param start_time ...
!> \param restricted ...
!> \param restricted: flag for LOW SPIN ROKS UNMATCHED_PROCEDURE_ARGUMENT: please check
!> \par History
!> \author Joost VandeVondele (02.2010)
! **************************************************************************************************
Expand Down Expand Up @@ -329,7 +328,6 @@ END SUBROUTINE jacobi_rotations
!> \param sweeps ...
!> \param out_each ...
!> \param restricted ...
!> \param restricted: flag for LOW SPIN ROKS UNMATCHED_PROCEDURE_ARGUMENT: please check
! **************************************************************************************************
SUBROUTINE jacobi_rotations_serial(weights, zij, vectors, max_iter, eps_localization, sweeps, &
out_each, restricted)
Expand Down

0 comments on commit 4de6411

Please sign in to comment.