| This keyword behaves as a switch'
- CALL val_write(keyword%lone_keyword_value,unit_nr=unit_nr,error=error)
+ CALL val_write(keyword%lone_keyword_value,unit_nr=unit_nr)
END IF
IF (ASSOCIATED(keyword%default_value).AND.keyword%type_of_var/=no_t) THEN
IF (ASSOCIATED(keyword%unit)) THEN
- my_unit=cp_unit_desc(keyword%unit,accept_undefined=.TRUE.,error=error)
+ my_unit=cp_unit_desc(keyword%unit,accept_undefined=.TRUE.)
WRITE(unit_nr,'(a)',advance="NO") '. Default unit: ' // '[' // TRIM(my_unit)// '], default value: '
ELSE
WRITE(unit_nr,'(a)',advance="NO") '. Default value: '
ENDIF
- CALL val_write(keyword%default_value,unit=keyword%unit,unit_nr=unit_nr,error=error)
+ CALL val_write(keyword%default_value,unit=keyword%unit,unit_nr=unit_nr)
IF (ASSOCIATED(keyword%unit)) THEN
WRITE(unit_nr,'(a)',advance="NO") TRIM(my_unit)
END IF
ELSE
IF (ASSOCIATED(keyword%unit)) THEN
- my_unit=cp_unit_desc(keyword%unit,accept_undefined=.TRUE.,error=error)
+ my_unit=cp_unit_desc(keyword%unit,accept_undefined=.TRUE.)
WRITE(unit_nr,'(a)',advance="NO") '. Default unit: ' // '[' // TRIM(my_unit)// '].'
END IF
ENDIF
@@ -840,15 +821,12 @@ END SUBROUTINE keyword_describe_html
!> \param keyword The keyword to describe
!> \param level ...
!> \param unit_number Number of the output unit
-!> \param error Variable to control error logging, stopping ...
-!> see module cp_error_handling
!> \author Matthias Krack
! *****************************************************************************
- SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
+ SUBROUTINE write_keyword_xml(keyword,level,unit_number)
TYPE(keyword_type), POINTER :: keyword
INTEGER, INTENT(IN) :: level, unit_number
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'write_keyword_xml', &
routineP = moduleN//':'//routineN
@@ -860,8 +838,8 @@ SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
LOGICAL :: failure
failure = .FALSE.
- CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,error,failure)
- CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,failure)
+ CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,failure)
! Indentation for current level, next level, etc.
@@ -941,7 +919,7 @@ SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
WRITE (UNIT=unit_number,FMT="(A)")&
REPEAT(" ",l1)//""
CASE DEFAULT
- CPAssert(.FALSE.,cp_warning_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_warning_level,routineP,failure)
END SELECT
short_string = ""
@@ -963,12 +941,10 @@ SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
IF (ASSOCIATED(keyword%unit)) THEN
CALL val_write_internal(val=keyword%default_value,&
string=string,&
- unit=keyword%unit,&
- error=error)
+ unit=keyword%unit)
ELSE
CALL val_write_internal(val=keyword%default_value,&
- string=string,&
- error=error)
+ string=string)
END IF
CALL compress(string)
WRITE (UNIT=unit_number,FMT="(A)")&
@@ -977,7 +953,7 @@ SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
END IF
IF (ASSOCIATED(keyword%unit)) THEN
- string = cp_unit_desc(keyword%unit,accept_undefined=.TRUE.,error=error)
+ string = cp_unit_desc(keyword%unit,accept_undefined=.TRUE.)
WRITE (UNIT=unit_number,FMT="(A)")&
REPEAT(" ",l1)//""//&
TRIM(ADJUSTL(string))//""
@@ -986,8 +962,7 @@ SUBROUTINE write_keyword_xml(keyword,level,unit_number,error)
IF (ASSOCIATED(keyword%lone_keyword_value).AND.&
(keyword%type_of_var /= no_t)) THEN
CALL val_write_internal(val=keyword%lone_keyword_value,&
- string=string,&
- error=error)
+ string=string)
WRITE (UNIT=unit_number,FMT="(A)")&
REPEAT(" ",l1)//""//&
TRIM(ADJUSTL(string))//""
@@ -1028,9 +1003,8 @@ END SUBROUTINE write_keyword_xml
!> \param location_string ...
!> \param matching_rank ...
!> \param matching_string ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE keyword_typo_match(keyword,unknown_string,location_string,matching_rank,matching_string,error)
+ SUBROUTINE keyword_typo_match(keyword,unknown_string,location_string,matching_rank,matching_string)
TYPE(keyword_type), POINTER :: keyword
CHARACTER(LEN=*) :: unknown_string, &
@@ -1038,7 +1012,6 @@ SUBROUTINE keyword_typo_match(keyword,unknown_string,location_string,matching_ra
INTEGER, DIMENSION(:), INTENT(INOUT) :: matching_rank
CHARACTER(LEN=*), DIMENSION(:), &
INTENT(INOUT) :: matching_string
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'keyword_typo_match', &
routineP = moduleN//':'//routineN
@@ -1048,8 +1021,8 @@ SUBROUTINE keyword_typo_match(keyword,unknown_string,location_string,matching_ra
LOGICAL :: failure
failure = .FALSE.
- CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,error,failure)
- CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,failure)
+ CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,failure)
DO i=1,SIZE(keyword%names)
diff --git a/src/input/input_parsing.F b/src/input/input_parsing.F
index 3e799ed714..36a6adeba3 100644
--- a/src/input/input_parsing.F
+++ b/src/input/input_parsing.F
@@ -79,16 +79,13 @@ MODULE input_parsing
!> \param parser ...
!> \param default_units ...
!> \param root_section if the root section should be parsed (defaults to true)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_section,error)
+ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_section)
TYPE(section_vals_type), POINTER :: section_vals
TYPE(cp_parser_type), POINTER :: parser
TYPE(cp_unit_set_type), POINTER :: default_units
LOGICAL, INTENT(in), OPTIONAL :: root_section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_parse', &
routineP = moduleN//':'//routineN
@@ -115,18 +112,18 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
root_sect=.TRUE.
IF (PRESENT(root_section)) root_sect=root_section
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(parser),cp_failure_level,routineP,error,failure)
- logger => cp_error_get_logger(error)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(parser),cp_failure_level,routineP,failure)
+ logger => cp_get_default_logger()
output_unit= cp_logger_get_default_io_unit(logger)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
- CPPrecondition(parser%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
+ CPPrecondition(parser%ref_count>0,cp_failure_level,routineP,failure)
IF (root_sect.and.parser%icol1>parser%icol2) &
CALL cp_assert(.FALSE.,cp_failure_level,&
cp_assertion_failed,routineP,&
"Error 1: this routine must be called just after having parsed the start of the section "&
- //TRIM(parser_location(parser,error=error)),error,failure)
+ //TRIM(parser_location(parser)),failure)
section => section_vals%section
IF (root_sect) THEN
token=parser%input_line(parser%icol1:parser%icol2)
@@ -134,41 +131,41 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
IF (token/=parser%section_character//section%name)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"Error 2: this routine must be called just after having parsed the start of the section "&
- //TRIM(parser_location(parser,error=error)), error,failure)
+ //TRIM(parser_location(parser)),failure)
END IF
CALL cp_assert(section%repeats.OR.SIZE(section_vals%values,2)==0,&
cp_failure_level,cp_assertion_failed,routineP,&
"Section "//TRIM(section%name)//&
- " should not repeat "//TRIM(parser_location(parser,error=error)),&
- error,failure)
+ " should not repeat "//TRIM(parser_location(parser)),&
+ failure)
skip_description=.TRUE.
skip_help=.TRUE.
- CALL section_vals_add_values(section_vals,error=error)
+ CALL section_vals_add_values(section_vals)
irs=SIZE(section_vals%values,2)
IF (ASSOCIATED(section%keywords(-1)%keyword)) THEN ! reads section params
keyword => section%keywords(-1)%keyword
NULLIFY(el)
- IF (keyword%type_of_var==lchar_t) CALL parser_skip_space(parser,error=error)
+ IF (keyword%type_of_var==lchar_t) CALL parser_skip_space(parser)
CALL val_create_parsing(el,type_of_var=keyword%type_of_var,&
n_var=keyword%n_var,default_value=keyword%lone_keyword_value,&
enum=keyword%enum,unit=keyword%unit,&
default_units=default_units,&
- parser=parser,error=error)
+ parser=parser)
NULLIFY(new_val)
- CALL cp_sll_val_create(new_val,el,error=error)
+ CALL cp_sll_val_create(new_val,el)
section_vals%values(-1,irs)%list => new_val
NULLIFY(el)
END IF
DO WHILE (.NOT.failure)
CALL parser_get_object(parser,token,newline=.TRUE.,&
- lower_to_upper=.TRUE.,at_end=at_end,error=error)
+ lower_to_upper=.TRUE.,at_end=at_end)
IF (at_end) THEN
CALL cp_assert(.not.root_sect,cp_failure_level,&
cp_assertion_failed,routineP,&
"unexpected end of file while parsing section "//&
- TRIM(section%name)//" "//TRIM(parser_location(parser,error=error)),&
- error,failure)
+ TRIM(section%name)//" "//TRIM(parser_location(parser)),&
+ failure)
EXIT
END IF
IF (failure) EXIT
@@ -176,16 +173,16 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
IF (token=="&END") THEN
! end of section
compatible_end=.TRUE.
- IF (parser_test_next_token(parser,error=error)/="EOL") THEN
+ IF (parser_test_next_token(parser)/="EOL") THEN
CALL parser_get_object(parser,token,newline=.FALSE.,&
- lower_to_upper=.TRUE.,error=error)
+ lower_to_upper=.TRUE.)
IF (token/="SECTION".and.token/=section%name) THEN
compatible_end=.FALSE.
END IF
END IF
- IF (parser_test_next_token(parser,error=error)/="EOL") THEN
+ IF (parser_test_next_token(parser)/="EOL") THEN
CALL parser_get_object(parser,token,newline=.FALSE.,&
- lower_to_upper=.TRUE.,error=error)
+ lower_to_upper=.TRUE.)
IF (token/=section%name) THEN
PRINT *,TRIM(token),"/=",TRIM(section%name)
compatible_end=.FALSE.
@@ -194,27 +191,27 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
IF (.NOT.compatible_end) THEN
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"non-compatible end of section "//TRIM(section%name)//" "//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
skip_description=.TRUE.
END IF
! RETURN
EXIT
END IF
- is=section_get_subsection_index(section,token(2:),error=error)
+ is=section_get_subsection_index(section,token(2:))
IF (is>0) THEN
! PRINT *,"parsing subsection "//TRIM(section%subsections(is)%section%name)&
! //" of section "// TRIM(section%name)
CALL section_vals_parse(section_vals%subs_vals(is,irs)%section_vals,&
- default_units=default_units,parser=parser,error=error)
+ default_units=default_units,parser=parser)
ELSE
! this should be an error (failure)
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"unknown subsection "//TRIM(token(2:))//" of section "&
- //TRIM(section%name),error=error)
+ //TRIM(section%name))
nSub=1
DO WHILE (nSub>0)
CALL parser_get_object(parser,token,newline=.TRUE.,&
- lower_to_upper=.TRUE.,error=error)
+ lower_to_upper=.TRUE.)
IF (failure) EXIT
IF (token(1:1)==parser%section_character) THEN
IF (token=="&END") THEN
@@ -230,52 +227,51 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
IF (output_unit>0) WRITE(output_unit,"(/,' ****** DESCRIPTION ******',/)")
skip_description=.TRUE.
desc_level=3
- IF (parser_test_next_token(parser,error=error)=="INT") THEN
- CALL parser_get_object(parser,desc_level,error=error)
+ IF (parser_test_next_token(parser)=="INT") THEN
+ CALL parser_get_object(parser,desc_level)
END IF
whole_section=.TRUE.
- DO WHILE (parser_test_next_token(parser,error=error)=="STR")
+ DO WHILE (parser_test_next_token(parser)=="STR")
whole_section=.FALSE.
CALL parser_get_object(parser,token,newline=.FALSE.,&
- lower_to_upper=.TRUE.,error=error)
- keyword => section_get_keyword(section,token,error=error)
+ lower_to_upper=.TRUE.)
+ keyword => section_get_keyword(section,token)
IF (.NOT.ASSOCIATED(keyword)) THEN
CALL cp_assert(.FALSE.,cp_warning_level,cp_assertion_failed,&
routineP,"unknown keyword to describe "//TRIM(token)//&
- " in section "//TRIM(section%name),error,failure)
+ " in section "//TRIM(section%name),failure)
ELSE
- CALL keyword_describe(keyword,output_unit,desc_level,error=error)
+ CALL keyword_describe(keyword,output_unit,desc_level)
END IF
END DO
IF (whole_section) THEN
- CALL section_describe(section, output_unit, desc_level,hide_root=.NOT.root_sect,&
- error=error)
+ CALL section_describe(section, output_unit, desc_level,hide_root=.NOT.root_sect)
END IF
IF (output_unit>0) WRITE(output_unit,"(/,' ****** =========== ******',/)")
ELSE ! token is a "normal" keyword
- ik=section_get_keyword_index(section,token,error=error)
+ ik=section_get_keyword_index(section,token)
IF (ik<1) THEN ! don't accept pseudo keyword names
parser%icol=parser%icol1-1 ! re-read also the actual token
ik=0
IF (.NOT.ASSOCIATED(section%keywords(0)%keyword)) THEN
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"found an unknown keyword "//TRIM(token)//&
- " in section "//TRIM(section%name),error=error)
+ " in section "//TRIM(section%name))
END IF
END IF
keyword => section%keywords(ik)%keyword
IF (ASSOCIATED(keyword)) THEN
NULLIFY(el)
IF (ik/=0.and.keyword%type_of_var==lchar_t) &
- CALL parser_skip_space(parser,error=error)
+ CALL parser_skip_space(parser)
CALL val_create_parsing(el,type_of_var=keyword%type_of_var,&
n_var=keyword%n_var,default_value=keyword%lone_keyword_value,&
enum=keyword%enum,unit=keyword%unit,&
- default_units=default_units,parser=parser,error=error)
+ default_units=default_units,parser=parser)
IF (.NOT.failure.AND.ASSOCIATED(el)) THEN
NULLIFY(new_val)
- CALL cp_sll_val_create(new_val,el,error=error)
+ CALL cp_sll_val_create(new_val,el)
last_val => section_vals%values(ik,irs)%list
IF (.NOT.ASSOCIATED(last_val)) THEN
section_vals%values(ik,irs)%list => new_val
@@ -284,18 +280,17 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
PRINT *, "Keyword "//TRIM(token)//&
" in section "//TRIM(section%name)//" should not repeat."
PRINT *, "new_val="
- CALL val_write(el,6,keyword%unit,error=error)
+ CALL val_write(el,6,keyword%unit)
PRINT *,"old_val="
DO
- CALL val_write(last_val%first_el,6,keyword%unit,&
- error=error)
+ CALL val_write(last_val%first_el,6,keyword%unit)
IF (.not.ASSOCIATED(last_val%rest)) EXIT
last_val => last_val%rest
END DO
END IF
CALL cp_assert(keyword%repeats,cp_failure_level,cp_assertion_failed,&
routineP,"Keyword "//TRIM(token)//&
- " in section "//TRIM(section%name)//" should not repeat.",error,failure)
+ " in section "//TRIM(section%name)//" should not repeat.",failure)
IF (ASSOCIATED(last_val,previous_list)) THEN
last_val=>previous_last
ELSE
@@ -326,7 +321,7 @@ RECURSIVE SUBROUTINE section_vals_parse(section_vals,parser,default_units,root_s
output_unit,0,0,0)
END IF
IF (.NOT.skip_description) THEN
- CALL section_describe(section,output_unit,3,error=error)
+ CALL section_describe(section,output_unit,3)
END IF
END IF
CALL timestop(handle)
@@ -342,14 +337,12 @@ END SUBROUTINE section_vals_parse
!> \param unit ...
!> \param default_units ...
!> \param default_value a default value if nothing is found (can be null)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> - no_t does not create a value
! *****************************************************************************
SUBROUTINE val_create_parsing(val,type_of_var, n_var,enum,&
- parser,unit,default_units,default_value,error)
+ parser,unit,default_units,default_value)
TYPE(val_type), POINTER :: val
INTEGER, INTENT(in) :: type_of_var, n_var
TYPE(enumeration_type), POINTER :: enum
@@ -357,7 +350,6 @@ SUBROUTINE val_create_parsing(val,type_of_var, n_var,enum,&
TYPE(cp_unit_type), POINTER :: unit
TYPE(cp_unit_set_type), POINTER :: default_units
TYPE(val_type), OPTIONAL, POINTER :: default_value
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_create_parsing', &
routineP = moduleN//':'//routineN
@@ -379,274 +371,273 @@ SUBROUTINE val_create_parsing(val,type_of_var, n_var,enum,&
CALL timeset(routineN,handle)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(val),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(val),cp_failure_level,routineP,failure)
SELECT CASE(type_of_var)
CASE(no_t)
CASE (logical_t)
NULLIFY(l_val_p)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ IF (parser_test_next_token(parser)=="EOL") THEN
IF (.NOT.ASSOCIATED(default_value)) THEN
IF (n_var<1) THEN
ALLOCATE(l_val_p(0),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
- CALL val_create(val,l_vals_ptr=l_val_p,error=error)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
+ CALL val_create(val,l_vals_ptr=l_val_p)
ELSE
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"no value was given and there is no default value"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
END IF
ELSE
- CPPrecondition(ASSOCIATED(default_value%l_val),cp_failure_level,routineP,error,failure)
- CALL val_create(val,l_vals=default_value%l_val,error=error)
+ CPPrecondition(ASSOCIATED(default_value%l_val),cp_failure_level,routineP,failure)
+ CALL val_create(val,l_vals=default_value%l_val)
END IF
ELSE
IF (n_var<1) THEN
NULLIFY(l_last,l_first)
- CALL parser_get_object(parser,l_val,error=error)
- CALL cp_create(l_first,l_val,error=error)
+ CALL parser_get_object(parser,l_val)
+ CALL cp_create(l_first,l_val)
l_last => l_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL"&
+ DO WHILE(parser_test_next_token(parser)/="EOL"&
.AND..NOT.failure)
- CALL parser_get_object(parser,l_val,error=error)
- CALL cp_create(l_new,l_val,error=error)
+ CALL parser_get_object(parser,l_val)
+ CALL cp_create(l_new,l_val)
l_last%rest => l_new
l_last => l_new
END DO
- l_val_p => cp_to_array(l_first,error=error)
- CALL cp_dealloc(l_first,error=error)
+ l_val_p => cp_to_array(l_first)
+ CALL cp_dealloc(l_first)
ELSE
ALLOCATE(l_val_p(n_var),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
DO i=1,n_var
- CALL parser_get_object(parser,l_val_p(i),error=error)
+ CALL parser_get_object(parser,l_val_p(i))
END DO
END IF
IF (ASSOCIATED(l_val_p)) THEN
- CALL val_create(val,l_vals_ptr=l_val_p,error=error)
+ CALL val_create(val,l_vals_ptr=l_val_p)
END IF
END IF
CASE (integer_t)
NULLIFY(i_val_p)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ IF (parser_test_next_token(parser)=="EOL") THEN
IF (.NOT.ASSOCIATED(default_value)) THEN
IF (n_var<1) THEN
ALLOCATE(i_val_p(0),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
- CALL val_create(val,i_vals_ptr=i_val_p,error=error)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
+ CALL val_create(val,i_vals_ptr=i_val_p)
ELSE
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"no value was given and there is no default value"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
END IF
ELSE
check = ASSOCIATED(default_value%i_val)
- CPPrecondition(check,cp_failure_level,routineP,error,failure)
- CALL val_create(val,i_vals=default_value%i_val,error=error)
+ CPPrecondition(check,cp_failure_level,routineP,failure)
+ CALL val_create(val,i_vals=default_value%i_val)
END IF
ELSE
IF (n_var<1) THEN
NULLIFY(i_last,i_first)
- CALL parser_get_object(parser,i_val,error=error)
- CALL cp_create(i_first,i_val,error=error)
+ CALL parser_get_object(parser,i_val)
+ CALL cp_create(i_first,i_val)
i_last => i_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL".AND..NOT.failure)
- CALL parser_get_object(parser,i_val,error=error)
- CALL cp_create(i_new,i_val,error=error)
+ DO WHILE(parser_test_next_token(parser)/="EOL".AND..NOT.failure)
+ CALL parser_get_object(parser,i_val)
+ CALL cp_create(i_new,i_val)
i_last%rest => i_new
i_last => i_new
END DO
- i_val_p => cp_to_array(i_first,error=error)
- CALL cp_dealloc(i_first,error=error)
+ i_val_p => cp_to_array(i_first)
+ CALL cp_dealloc(i_first)
ELSE
ALLOCATE(i_val_p(n_var),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
DO i=1,n_var
- CALL parser_get_object(parser,i_val_p(i),error=error)
+ CALL parser_get_object(parser,i_val_p(i))
END DO
END IF
IF (ASSOCIATED(i_val_p)) THEN
- CALL val_create(val,i_vals_ptr=i_val_p,error=error)
+ CALL val_create(val,i_vals_ptr=i_val_p)
END IF
END IF
CASE (real_t)
NULLIFY(r_val_p)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ IF (parser_test_next_token(parser)=="EOL") THEN
IF (.NOT.ASSOCIATED(default_value)) THEN
IF (n_var<1) THEN
ALLOCATE(r_val_p(0),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
- CALL val_create(val,r_vals_ptr=r_val_p,error=error)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
+ CALL val_create(val,r_vals_ptr=r_val_p)
ELSE
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"no value was given and there is no default value"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
END IF
ELSE
- CPPrecondition(ASSOCIATED(default_value%r_val),cp_failure_level,routineP,error,failure)
- CALL val_create(val,r_vals=default_value%r_val,error=error)
+ CPPrecondition(ASSOCIATED(default_value%r_val),cp_failure_level,routineP,failure)
+ CALL val_create(val,r_vals=default_value%r_val)
END IF
ELSE
IF (n_var<1) THEN
NULLIFY(r_last,r_first)
c_val = ""
- CALL get_r_val(r_val, parser, unit, default_units, c_val, error)
- CALL cp_create(r_first,r_val,error=error)
+ CALL get_r_val(r_val, parser, unit, default_units, c_val)
+ CALL cp_create(r_first,r_val)
r_last => r_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL".AND..NOT.failure)
- CALL get_r_val(r_val, parser, unit, default_units, c_val, error)
- CALL cp_create(r_new,r_val,error=error)
+ DO WHILE(parser_test_next_token(parser)/="EOL".AND..NOT.failure)
+ CALL get_r_val(r_val, parser, unit, default_units, c_val)
+ CALL cp_create(r_new,r_val)
r_last%rest => r_new
r_last => r_new
END DO
NULLIFY(r_last)
- r_val_p => cp_to_array(r_first,error=error)
- CALL cp_dealloc(r_first,error=error)
+ r_val_p => cp_to_array(r_first)
+ CALL cp_dealloc(r_first)
ELSE
ALLOCATE(r_val_p(n_var),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
c_val = ""
DO i=1,n_var
- CALL get_r_val(r_val_p(i), parser, unit, default_units, c_val, error)
+ CALL get_r_val(r_val_p(i), parser, unit, default_units, c_val)
END DO
END IF
IF (ASSOCIATED(r_val_p)) THEN
- CALL val_create(val,r_vals_ptr=r_val_p,error=error)
+ CALL val_create(val,r_vals_ptr=r_val_p)
END IF
END IF
CASE (char_t)
NULLIFY(c_val_p)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ IF (parser_test_next_token(parser)=="EOL") THEN
IF (n_var<1) THEN
ALLOCATE(c_val_p(1),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
c_val_p(1)=' '
- CALL val_create(val,c_vals_ptr=c_val_p,error=error)
+ CALL val_create(val,c_vals_ptr=c_val_p)
ELSE
IF (.NOT.ASSOCIATED(default_value)) THEN
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"no value was given and there is no default value"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
ELSE
- CPPrecondition(ASSOCIATED(default_value%c_val),cp_failure_level,routineP,error,failure)
- CALL val_create(val,c_vals=default_value%c_val,error=error)
+ CPPrecondition(ASSOCIATED(default_value%c_val),cp_failure_level,routineP,failure)
+ CALL val_create(val,c_vals=default_value%c_val)
END IF
END IF
ELSE
IF (n_var<1) THEN
- CPAssert(n_var==-1,cp_failure_level,routineP,error,failure)
+ CPAssert(n_var==-1,cp_failure_level,routineP,failure)
NULLIFY(c_last,c_first)
- CALL parser_get_object(parser,c_val,error=error)
- CALL cp_create(c_first,c_val,error=error)
+ CALL parser_get_object(parser,c_val)
+ CALL cp_create(c_first,c_val)
c_last => c_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL"&
+ DO WHILE(parser_test_next_token(parser)/="EOL"&
.AND..NOT.failure)
- CALL parser_get_object(parser,c_val,error=error)
- CALL cp_create(c_new,c_val,error=error)
+ CALL parser_get_object(parser,c_val)
+ CALL cp_create(c_new,c_val)
c_last%rest => c_new
c_last => c_new
END DO
- c_val_p => cp_to_array(c_first,error=error)
- CALL cp_dealloc(c_first,error=error)
+ c_val_p => cp_to_array(c_first)
+ CALL cp_dealloc(c_first)
ELSE
ALLOCATE(c_val_p(n_var),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
DO i=1,n_var
- CALL parser_get_object(parser,c_val_p(i),error=error)
+ CALL parser_get_object(parser,c_val_p(i))
END DO
END IF
IF (ASSOCIATED(c_val_p)) THEN
- CALL val_create(val,c_vals_ptr=c_val_p,error=error)
+ CALL val_create(val,c_vals_ptr=c_val_p)
END IF
END IF
CASE (lchar_t)
CALL cp_assert(.NOT.ASSOCIATED(default_value),cp_failure_level,cp_assertion_failed,&
routineP,"input variables of type lchar_t cannot have a lone keyword attribute,"//&
" no value is interpreted as empty string"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
CALL cp_assert(n_var==1,cp_failure_level,cp_assertion_failed,&
routineP,"input variables of type lchar_t cannot be repeated,"//&
" one always represent a whole line, till the end"//&
- TRIM(parser_location(parser,error=error)),error,failure)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ TRIM(parser_location(parser)),failure)
+ IF (parser_test_next_token(parser)=="EOL") THEN
ALLOCATE(c_val_p(1),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
c_val_p(1)=' '
ELSE
NULLIFY(c_last,c_first)
- CALL parser_get_object(parser,c_val,string_length=LEN(c_val),&
- error=error)
- CALL cp_create(c_first,c_val,error=error)
+ CALL parser_get_object(parser,c_val,string_length=LEN(c_val))
+ CALL cp_create(c_first,c_val)
c_last => c_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL"&
+ DO WHILE(parser_test_next_token(parser)/="EOL"&
.AND..NOT.failure)
- CALL parser_get_object(parser,c_val,string_length=LEN(c_val),error=error)
- CALL cp_create(c_new,c_val,error=error)
+ CALL parser_get_object(parser,c_val,string_length=LEN(c_val))
+ CALL cp_create(c_new,c_val)
c_last%rest => c_new
c_last => c_new
END DO
- c_val_p => cp_to_array(c_first,error=error)
- CALL cp_dealloc(c_first,error=error)
+ c_val_p => cp_to_array(c_first)
+ CALL cp_dealloc(c_first)
END IF
- CPPostcondition(ASSOCIATED(c_val_p),cp_failure_level,routineP,error,failure)
- CALL val_create(val,lc_vals_ptr=c_val_p,error=error)
+ CPPostcondition(ASSOCIATED(c_val_p),cp_failure_level,routineP,failure)
+ CALL val_create(val,lc_vals_ptr=c_val_p)
CASE (enum_t)
- CPPrecondition(ASSOCIATED(enum),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(enum),cp_failure_level,routineP,failure)
NULLIFY(i_val_p)
- IF (parser_test_next_token(parser,error=error)=="EOL") THEN
+ IF (parser_test_next_token(parser)=="EOL") THEN
IF (.NOT.ASSOCIATED(default_value)) THEN
IF (n_var<1) THEN
ALLOCATE(i_val_p(0),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
- CALL val_create(val,i_vals_ptr=i_val_p,error=error)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
+ CALL val_create(val,i_vals_ptr=i_val_p)
ELSE
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"no value was given and there is no default value"//&
- TRIM(parser_location(parser,error=error)),error,failure)
+ TRIM(parser_location(parser)),failure)
END IF
ELSE
- CPPrecondition(ASSOCIATED(default_value%i_val),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(default_value%i_val),cp_failure_level,routineP,failure)
CALL val_create(val,i_vals=default_value%i_val,&
- enum=default_value%enum,error=error)
+ enum=default_value%enum)
END IF
ELSE
IF (n_var<1) THEN
NULLIFY(i_last,i_first)
- CALL parser_get_object(parser,c_val,error=error)
- CALL cp_create(i_first,enum_c2i(enum,c_val,error=error),error=error)
+ CALL parser_get_object(parser,c_val)
+ CALL cp_create(i_first,enum_c2i(enum,c_val))
i_last => i_first
- DO WHILE(parser_test_next_token(parser,error=error)/="EOL".AND..NOT.failure)
- CALL parser_get_object(parser,c_val,error=error)
- CALL cp_create(i_new,enum_c2i(enum,c_val,error=error),error=error)
+ DO WHILE(parser_test_next_token(parser)/="EOL".AND..NOT.failure)
+ CALL parser_get_object(parser,c_val)
+ CALL cp_create(i_new,enum_c2i(enum,c_val))
i_last%rest => i_new
i_last => i_new
END DO
- i_val_p => cp_to_array(i_first,error=error)
- CALL cp_dealloc(i_first,error=error)
+ i_val_p => cp_to_array(i_first)
+ CALL cp_dealloc(i_first)
ELSE
ALLOCATE(i_val_p(n_var),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
DO i=1,n_var
- CALL parser_get_object(parser,c_val,error=error)
- i_val_p(i)=enum_c2i(enum,c_val,error=error)
+ CALL parser_get_object(parser,c_val)
+ i_val_p(i)=enum_c2i(enum,c_val)
END DO
END IF
IF (ASSOCIATED(i_val_p)) THEN
- CALL val_create(val,i_vals_ptr=i_val_p,enum=enum,error=error)
+ CALL val_create(val,i_vals_ptr=i_val_p,enum=enum)
END IF
END IF
CASE default
CALL cp_unimplemented_error(routineP, "type "//cp_to_string(type_of_var)//&
"unknown to the parser"//&
CPSourceFileRef,&
- error,cp_failure_level)
+ cp_failure_level)
END SELECT
- IF (parser_test_next_token(parser,error=error).NE."EOL") THEN
- location=TRIM(parser_location(parser,error=error))
- CALL parser_get_object(parser,info,error=error)
+ IF (parser_test_next_token(parser).NE."EOL") THEN
+ location=TRIM(parser_location(parser))
+ CALL parser_get_object(parser,info)
CALL cp_assert(.FALSE.,&
cp_failure_level,cp_assertion_failed,routineP,&
"found unexpected extra argument "//TRIM(info)//" at "//&
- location,error,failure)
+ location,failure)
ENDIF
CALL timestop(handle)
@@ -660,18 +651,15 @@ END SUBROUTINE val_create_parsing
!> \param unit ...
!> \param default_units ...
!> \param c_val ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino - 11.2007 [tlaino] - University of Zurich
! *****************************************************************************
- SUBROUTINE get_r_val(r_val, parser, unit, default_units, c_val, error)
+ SUBROUTINE get_r_val(r_val, parser, unit, default_units, c_val)
REAL(kind=dp), INTENT(OUT) :: r_val
TYPE(cp_parser_type), POINTER :: parser
TYPE(cp_unit_type), POINTER :: unit
TYPE(cp_unit_set_type), POINTER :: default_units
CHARACTER(len=default_string_length), &
INTENT(INOUT) :: c_val
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'get_r_val', &
routineP = moduleN//':'//routineN
@@ -682,29 +670,29 @@ SUBROUTINE get_r_val(r_val, parser, unit, default_units, c_val, error)
failure = .FALSE.
NULLIFY(my_unit)
IF (ASSOCIATED(unit)) THEN
- IF ('STR'==parser_test_next_token(parser,error=error)) THEN
- CALL parser_get_object(parser,c_val,error=error)
+ IF ('STR'==parser_test_next_token(parser)) THEN
+ CALL parser_get_object(parser,c_val)
check = c_val(1:1)=="["
- CPPrecondition(check,cp_failure_level,routineP,error,failure)
+ CPPrecondition(check,cp_failure_level,routineP,failure)
check = c_val(LEN_TRIM(c_val):LEN_TRIM(c_val))=="]"
- CPPrecondition(check,cp_failure_level,routineP,error,failure)
- CALL cp_unit_create(my_unit,c_val(2:LEN_TRIM(c_val)-1),error=error)
+ CPPrecondition(check,cp_failure_level,routineP,failure)
+ CALL cp_unit_create(my_unit,c_val(2:LEN_TRIM(c_val)-1))
ELSE
IF (c_val /= "") THEN
- CALL cp_unit_create(my_unit,c_val(2:LEN_TRIM(c_val)-1),error=error)
+ CALL cp_unit_create(my_unit,c_val(2:LEN_TRIM(c_val)-1))
ELSE
my_unit => unit
END IF
END IF
- CALL cp_assert(cp_unit_compatible(unit,my_unit,error=error),&
+ CALL cp_assert(cp_unit_compatible(unit,my_unit),&
cp_failure_level,cp_assertion_failed,routineP,"Incompatible units. Defined as ("//&
- TRIM(cp_unit_desc(unit,error=error))//") specified in input as ("//&
- TRIM(cp_unit_desc(my_unit,error=error))//"). These units are incompatible!",error,failure)
+ TRIM(cp_unit_desc(unit))//") specified in input as ("//&
+ TRIM(cp_unit_desc(my_unit))//"). These units are incompatible!",failure)
END IF
- CALL parser_get_object(parser,r_val,error=error)
+ CALL parser_get_object(parser,r_val)
IF (ASSOCIATED(unit)) THEN
- r_val=cp_unit_to_cp2k1(r_val,my_unit,default_units,error=error)
- IF (.NOT.(ASSOCIATED(my_unit,unit))) CALL cp_unit_release(my_unit,error=error)
+ r_val=cp_unit_to_cp2k1(r_val,my_unit,default_units)
+ IF (.NOT.(ASSOCIATED(my_unit,unit))) CALL cp_unit_release(my_unit)
END IF
END SUBROUTINE get_r_val
diff --git a/src/input/input_section_types.F b/src/input/input_section_types.F
index 0786fd6322..82e75aca0d 100644
--- a/src/input/input_section_types.F
+++ b/src/input/input_section_types.F
@@ -145,19 +145,16 @@ MODULE input_section_types
!> structure, defaults to 0
!> \param repeats if this section can repeat (defaults to false)
!> \param citations ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_create(section,name,description,n_keywords,&
- n_subsections, repeats, citations, error)
+ n_subsections, repeats, citations)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: name, description
INTEGER, INTENT(in), OPTIONAL :: n_keywords, n_subsections
LOGICAL, INTENT(in), OPTIONAL :: repeats
INTEGER, DIMENSION(:), INTENT(IN), &
OPTIONAL :: citations
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_create', &
routineP = moduleN//':'//routineN
@@ -168,14 +165,14 @@ SUBROUTINE section_create(section,name,description,n_keywords,&
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
my_n_keywords=10
IF (PRESENT(n_keywords)) my_n_keywords=n_keywords
my_n_subsections=0
IF (PRESENT(n_subsections)) my_n_subsections=n_subsections
ALLOCATE(section,stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
last_section_id=last_section_id+1
section%id_nr=last_section_id
section%ref_count=1
@@ -198,18 +195,18 @@ SUBROUTINE section_create(section,name,description,n_keywords,&
NULLIFY(section%citations)
IF (PRESENT(citations)) THEN
ALLOCATE(section%citations(SIZE(citations)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
section%citations=citations
ENDIF
ALLOCATE(section%keywords(-1:my_n_keywords),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO i=-1,my_n_keywords
NULLIFY(section%keywords(i)%keyword)
END DO
ALLOCATE(section%subsections(my_n_subsections),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO i=1,my_n_subsections
NULLIFY(section%subsections(i)%section)
END DO
@@ -218,13 +215,10 @@ END SUBROUTINE section_create
! *****************************************************************************
!> \brief retains the given keyword list (see doc/ReferenceCounting.html)
!> \param section the list to retain
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_retain(section,error)
+ SUBROUTINE section_retain(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_retain', &
routineP = moduleN//':'//routineN
@@ -233,21 +227,18 @@ SUBROUTINE section_retain(section,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPreconditionNoFail(section%ref_count>0,cp_failure_level,routineP,error)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPreconditionNoFail(section%ref_count>0,cp_failure_level,routineP)
section%ref_count=section%ref_count+1
END SUBROUTINE section_retain
! *****************************************************************************
!> \brief releases the given keyword list (see doc/ReferenceCounting.html)
!> \param section the list to release
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- RECURSIVE SUBROUTINE section_release(section,error)
+ RECURSIVE SUBROUTINE section_release(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_release', &
routineP = moduleN//':'//routineN
@@ -258,31 +249,31 @@ RECURSIVE SUBROUTINE section_release(section,error)
failure=.FALSE.
IF (ASSOCIATED(section)) THEN
- CPPreconditionNoFail(section%ref_count>0,cp_failure_level,routineP,error)
+ CPPreconditionNoFail(section%ref_count>0,cp_failure_level,routineP)
section%ref_count=section%ref_count-1
IF (section%ref_count==0) THEN
IF (ASSOCIATED(section%citations)) THEN
DEALLOCATE(section%citations,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
ENDIF
IF (ASSOCIATED(section%keywords)) THEN
DO i=-1,UBOUND(section%keywords,1)
- CALL keyword_release(section%keywords(i)%keyword,error=error)
+ CALL keyword_release(section%keywords(i)%keyword)
END DO
DEALLOCATE(section%keywords,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
section%n_keywords=0
IF (ASSOCIATED(section%subsections)) THEN
DO i=1,SIZE(section%subsections)
- CALL section_release(section%subsections(i)%section,error=error)
+ CALL section_release(section%subsections(i)%section)
END DO
DEALLOCATE(section%subsections,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
DEALLOCATE(section%description)
DEALLOCATE(section,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
NULLIFY(section)
END IF
@@ -291,13 +282,11 @@ END SUBROUTINE section_release
! *****************************************************************************
!> \brief collects additional information on the section for IO + documentation
!> \param section ...
-!> \param error ...
!> \retval message ...
!> \author fawzi
! *****************************************************************************
- FUNCTION get_section_info(section, error) RESULT(message)
+ FUNCTION get_section_info(section) RESULT(message)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(LEN=default_path_length) :: message
CHARACTER(len=*), PARAMETER :: routineN = 'get_section_info', &
@@ -329,16 +318,13 @@ END FUNCTION get_section_info
!> \param hide_root if the name of the first section should be hidden
!> (defaults to false).
!> \param recurse ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- RECURSIVE SUBROUTINE section_describe(section, unit_nr, level, hide_root, recurse,error)
+ RECURSIVE SUBROUTINE section_describe(section, unit_nr, level, hide_root, recurse)
TYPE(section_type), POINTER :: section
INTEGER, INTENT(in) :: unit_nr, level
LOGICAL, INTENT(in), OPTIONAL :: hide_root
INTEGER, INTENT(in), OPTIONAL :: recurse
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_describe', &
routineP = moduleN//':'//routineN
@@ -354,26 +340,26 @@ RECURSIVE SUBROUTINE section_describe(section, unit_nr, level, hide_root, recurs
my_recurse=0
IF (PRESENT(recurse)) my_recurse=recurse
IF (ASSOCIATED(section)) THEN
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
IF (.not.my_hide_root)&
WRITE(unit_nr,"('*** section &',a,' ***')")TRIM(section%name)
IF (level>1) THEN
- message = get_section_info(section, error)
+ message = get_section_info(section)
CALL print_message(TRIM(a2s(section%description))//TRIM(message),unit_nr,0,0,0)
END IF
IF (level>0) THEN
IF (ASSOCIATED(section%keywords(-1)%keyword)) THEN
CALL keyword_describe(section%keywords(-1)%keyword,unit_nr,&
- level,error=error)
+ level)
END IF
IF (ASSOCIATED(section%keywords(0)%keyword)) THEN
CALL keyword_describe(section%keywords(0)%keyword,unit_nr,&
- level,error=error)
+ level)
END IF
DO ikeyword=1,section%n_keywords
CALL keyword_describe(section%keywords(ikeyword)%keyword,unit_nr,&
- level,error=error)
+ level)
END DO
END IF
IF (section%n_subsections>0 .and.my_recurse>=0) THEN
@@ -382,7 +368,7 @@ RECURSIVE SUBROUTINE section_describe(section, unit_nr, level, hide_root, recurs
DO isub=1,section%n_subsections
IF (my_recurse>0) THEN
CALL section_describe(section%subsections(isub)%section,unit_nr,&
- level,recurse=my_recurse-1,error=error)
+ level,recurse=my_recurse-1)
ELSE
WRITE(unit_nr,"(' ',a)") section%subsections(isub)%section%name
END IF
@@ -402,13 +388,11 @@ END SUBROUTINE section_describe
!> \param prefix ...
!> \param depth ...
!> \param unit_number ...
-!> \param error ...
! *****************************************************************************
- RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number, error)
+ RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: prefix
INTEGER, INTENT(in) :: depth, unit_number
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_describe_html', &
routineP = moduleN//':'//routineN
@@ -423,7 +407,7 @@ RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number,
failure=.FALSE.
IF (ASSOCIATED(section)) THEN
local_prefix=TRIM(prefix//"~"//TRIM(section%name))
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
CALL open_file(unit_number=unit_nr,file_name=TRIM(local_prefix)//".html",&
file_status="UNKNOWN",file_action="WRITE")
WRITE(unit_nr,FMT='(A)') ""
@@ -441,7 +425,7 @@ RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number,
name(depth+1)=TRIM(section%name)
WRITE(unit_nr,FMT='(A)') ''//TRIM(name(depth+1))//'.'
- message = get_section_info(section, error)
+ message = get_section_info(section)
WRITE(unit_nr,FMT='(A)') '
'//TRIM(a2s(section%description))//TRIM(message)
IF (ASSOCIATED(section%citations)) THEN
@@ -487,7 +471,7 @@ RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number,
WRITE(unit_nr,FMT='(A)') ""
DO ikeyword=-1,section%n_keywords
IF (ASSOCIATED(section%keywords(ikeyword)%keyword)) THEN
- CALL keyword_describe_html(section%keywords(ikeyword)%keyword,unit_nr,error=error)
+ CALL keyword_describe_html(section%keywords(ikeyword)%keyword,unit_nr)
END IF
END DO
WRITE(unit_nr,FMT='(A)') " "
@@ -500,8 +484,7 @@ RECURSIVE SUBROUTINE section_describe_html(section, prefix, depth, unit_number,
WRITE(unit_nr,FMT='(A)') ""
CALL close_file(unit_nr)
DO isub=1,section%n_subsections
- CALL section_describe_html(section%subsections(isub)%section,TRIM(local_prefix),depth+1,unit_number,&
- error=error)
+ CALL section_describe_html(section%subsections(isub)%section,TRIM(local_prefix),depth+1,unit_number)
END DO
END IF
END SUBROUTINE section_describe_html
@@ -511,13 +494,11 @@ END SUBROUTINE section_describe_html
!> \param section ...
!> \param prefix ...
!> \param unit_nr ...
-!> \param error ...
! *****************************************************************************
- RECURSIVE SUBROUTINE section_describe_index_html(section,prefix, unit_nr, error)
+ RECURSIVE SUBROUTINE section_describe_index_html(section,prefix, unit_nr)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: prefix
INTEGER, INTENT(in) :: unit_nr
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_describe_index_html', &
routineP = moduleN//':'//routineN
@@ -528,15 +509,14 @@ RECURSIVE SUBROUTINE section_describe_index_html(section,prefix, unit_nr, error)
failure=.FALSE.
IF (ASSOCIATED(section)) THEN
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
local_prefix=TRIM(prefix//"~"//TRIM(section%name))
WRITE(unit_nr,FMT='(A)') &
''//TRIM(section%name)//""
IF (section%n_subsections>0) THEN
WRITE(unit_nr,FMT='(A)') ""
DO isub=1,section%n_subsections
- CALL section_describe_index_html(section%subsections(isub)%section,TRIM(local_prefix),unit_nr,&
- error=error)
+ CALL section_describe_index_html(section%subsections(isub)%section,TRIM(local_prefix),unit_nr)
END DO
WRITE(unit_nr,FMT='(A)') " "
ENDIF
@@ -547,17 +527,14 @@ END SUBROUTINE section_describe_index_html
!> \brief returns the index of requested subsection (-1 if not found)
!> \param section the root section
!> \param subsection_name the name of the subsection you want to get
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
!> \note
!> private utility function
! *****************************************************************************
- FUNCTION section_get_subsection_index(section,subsection_name,error) RESULT(res)
+ FUNCTION section_get_subsection_index(section,subsection_name) RESULT(res)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: subsection_name
- TYPE(cp_error_type), INTENT(inout) :: error
INTEGER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_get_subsection_index', &
@@ -569,13 +546,13 @@ FUNCTION section_get_subsection_index(section,subsection_name,error) RESULT(res)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
res=-1
upc_name=subsection_name
CALL uppercase(upc_name)
DO isub=1,section%n_subsections
- CPInvariant(ASSOCIATED(section%subsections(isub)%section),cp_failure_level,routineP,error,failure)
+ CPInvariant(ASSOCIATED(section%subsections(isub)%section),cp_failure_level,routineP,failure)
IF (section%subsections(isub)%section%name==upc_name) THEN
res=isub
EXIT
@@ -587,15 +564,12 @@ END FUNCTION section_get_subsection_index
!> \brief returns the requested subsection
!> \param section the root section
!> \param subsection_name the name of the subsection you want to get
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
- FUNCTION section_get_subsection(section,subsection_name,error) RESULT(res)
+ FUNCTION section_get_subsection(section,subsection_name) RESULT(res)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: subsection_name
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(section_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_get_subsection', &
@@ -603,7 +577,7 @@ FUNCTION section_get_subsection(section,subsection_name,error) RESULT(res)
INTEGER :: isub
- isub=section_get_subsection_index(section,subsection_name,error=error)
+ isub=section_get_subsection_index(section,subsection_name)
IF (isub>0) THEN
res => section%subsections(isub)%section
ELSE
@@ -615,17 +589,14 @@ END FUNCTION section_get_subsection
!> \brief returns the index of the requested keyword (or -2 if not found)
!> \param section the section the keyword is in
!> \param keyword_name the keyword you are interested in
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
!> \note
!> private utility function
! *****************************************************************************
- FUNCTION section_get_keyword_index(section,keyword_name,error) RESULT(res)
+ FUNCTION section_get_keyword_index(section,keyword_name) RESULT(res)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
INTEGER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_get_keyword_index', &
@@ -637,9 +608,9 @@ FUNCTION section_get_keyword_index(section,keyword_name,error) RESULT(res)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(section%keywords),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(section%keywords),cp_failure_level,routineP,failure)
res=-2
upc_name=keyword_name
CALL uppercase(upc_name)
@@ -652,7 +623,7 @@ FUNCTION section_get_keyword_index(section,keyword_name,error) RESULT(res)
END DO
IF (res==-2) THEN
k_search_loop: DO ik=1,section%n_keywords
- CPInvariant(ASSOCIATED(section%keywords(ik)%keyword),cp_failure_level,routineP,error,failure)
+ CPInvariant(ASSOCIATED(section%keywords(ik)%keyword),cp_failure_level,routineP,failure)
DO in=1,SIZE(section%keywords(ik)%keyword%names)
IF (section%keywords(ik)%keyword%names(in)==upc_name) THEN
res = ik
@@ -667,15 +638,12 @@ END FUNCTION section_get_keyword_index
!> \brief returns the requested keyword
!> \param section the section the keyword is in
!> \param keyword_name the keyword you are interested in
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
- RECURSIVE FUNCTION section_get_keyword(section,keyword_name,error) RESULT(res)
+ RECURSIVE FUNCTION section_get_keyword(section,keyword_name) RESULT(res)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(keyword_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_get_keyword', &
@@ -687,14 +655,14 @@ RECURSIVE FUNCTION section_get_keyword(section,keyword_name,error) RESULT(res)
failure = .FALSE.
IF (INDEX(keyword_name,"%")/=0) THEN
my_index = INDEX(keyword_name,"%") + 1
- CPPrecondition(ASSOCIATED(section%subsections),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section%subsections),cp_failure_level,routineP,failure)
DO ik = LBOUND(section%subsections,1), UBOUND(section%subsections,1)
IF (section%subsections(ik)%section%name==keyword_name(1:my_index-2)) EXIT
END DO
- CPPrecondition(ik<=UBOUND(section%subsections,1),cp_failure_level,routineP,error,failure)
- res => section_get_keyword(section%subsections(ik)%section,keyword_name(my_index:),error)
+ CPPrecondition(ik<=UBOUND(section%subsections,1),cp_failure_level,routineP,failure)
+ res => section_get_keyword(section%subsections(ik)%section,keyword_name(my_index:))
ELSE
- ik=section_get_keyword_index(section,keyword_name,error)
+ ik=section_get_keyword_index(section,keyword_name)
IF (ik==-2) THEN
NULLIFY(res)
ELSE
@@ -713,22 +681,17 @@ END FUNCTION section_get_keyword
!> \param name ...
!> \param description ...
!> \param citations ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
-!>
-!> For the other attributes see the section type
!> \author fawzi
!> \note
!> give direct access to keywords and subsections?
! *****************************************************************************
SUBROUTINE section_get(section,frozen, repeats,id_nr,ref_count, &
- name,description,citations,error)
+ name,description,citations)
TYPE(section_type), POINTER :: section
LOGICAL, INTENT(out), OPTIONAL :: frozen, repeats
INTEGER, INTENT(out), OPTIONAL :: id_nr, ref_count
CHARACTER(len=*), INTENT(out), OPTIONAL :: name, description
INTEGER, DIMENSION(:), OPTIONAL, POINTER :: citations
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_get', &
routineP = moduleN//':'//routineN
@@ -737,8 +700,8 @@ SUBROUTINE section_get(section,frozen, repeats,id_nr,ref_count, &
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
IF (PRESENT(frozen)) frozen=section%frozen
IF (PRESENT(repeats)) repeats=section%repeats
IF (PRESENT(id_nr)) id_nr=section%id_nr
@@ -752,14 +715,11 @@ END SUBROUTINE section_get
!> \brief adds a keyword to the given section
!> \param section the section to which the keyword should be added
!> \param keyword the keyword to add
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_add_keyword(section,keyword,error)
+ SUBROUTINE section_add_keyword(section,keyword)
TYPE(section_type), POINTER :: section
TYPE(keyword_type), POINTER :: keyword
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_add_keyword', &
routineP = moduleN//':'//routineN
@@ -771,17 +731,17 @@ SUBROUTINE section_add_keyword(section,keyword,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
- CPPrecondition(.NOT.section%frozen,cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,error,failure)
- CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,error,failure)
- CALL keyword_retain(keyword,error=error)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
+ CPPrecondition(.NOT.section%frozen,cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(keyword),cp_failure_level,routineP,failure)
+ CPPrecondition(keyword%ref_count>0,cp_failure_level,routineP,failure)
+ CALL keyword_retain(keyword)
IF (keyword%names(1)=="_SECTION_PARAMETERS_") THEN
- CALL keyword_release(section%keywords(-1)%keyword,error=error)
+ CALL keyword_release(section%keywords(-1)%keyword)
section%keywords(-1)%keyword => keyword
ELSE IF (keyword%names(1)=="_DEFAULT_KEYWORD_") THEN
- CALL keyword_release(section%keywords(0)%keyword,error=error)
+ CALL keyword_release(section%keywords(0)%keyword)
section%keywords(0)%keyword => keyword
ELSE
DO k=1,SIZE(keyword%names)
@@ -791,7 +751,7 @@ SUBROUTINE section_add_keyword(section,keyword,error)
CALL cp_assert(.FALSE., cp_failure_level,cp_assertion_failed,routineP,&
"trying to add a keyword with a name ("//&
TRIM(keyword%names(k))//") that was already used in section "&
- //TRIM(section%name),error,failure)
+ //TRIM(section%name),failure)
ENDIF
END DO
END DO
@@ -799,7 +759,7 @@ SUBROUTINE section_add_keyword(section,keyword,error)
IF (UBOUND(section%keywords,1)==section%n_keywords) THEN
ALLOCATE(new_keywords(-1:section%n_keywords+10),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO i=-1,section%n_keywords
new_keywords(i)%keyword => section%keywords(i)%keyword
END DO
@@ -807,7 +767,7 @@ SUBROUTINE section_add_keyword(section,keyword,error)
NULLIFY(new_keywords(i)%keyword)
END DO
DEALLOCATE(section%keywords,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
section%keywords => new_keywords
END IF
section%n_keywords=section%n_keywords+1
@@ -819,13 +779,10 @@ END SUBROUTINE section_add_keyword
!> \brief adds a subsection to the given section
!> \param section to section to which you want to add a subsection
!> \param subsection the subsection to add
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_add_subsection(section,subsection,error)
+ SUBROUTINE section_add_subsection(section,subsection)
TYPE(section_type), POINTER :: section, subsection
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_add_subsection', &
routineP = moduleN//':'//routineN
@@ -837,13 +794,13 @@ SUBROUTINE section_add_subsection(section,subsection,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(subsection),cp_failure_level,routineP,error,failure)
- CPPrecondition(subsection%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(subsection),cp_failure_level,routineP,failure)
+ CPPrecondition(subsection%ref_count>0,cp_failure_level,routineP,failure)
IF (SIZE(section%subsections) section%subsections(i)%section
END DO
@@ -851,7 +808,7 @@ SUBROUTINE section_add_subsection(section,subsection,error)
NULLIFY(new_subsections(i)%section)
END DO
DEALLOCATE(section%subsections,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
section%subsections => new_subsections
END IF
DO i=1,section%n_subsections
@@ -859,9 +816,9 @@ SUBROUTINE section_add_subsection(section,subsection,error)
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"trying to add a subsection with a name ("//&
TRIM(subsection%name)//") that was already used in section "&
- //TRIM(section%name),error,failure)
+ //TRIM(section%name),failure)
END DO
- CALL section_retain(subsection,error=error)
+ CALL section_retain(subsection)
section%n_subsections=section%n_subsections+1
section%subsections(section%n_subsections)%section => subsection
END SUBROUTINE section_add_subsection
@@ -870,14 +827,11 @@ END SUBROUTINE section_add_subsection
!> \brief creates a object where to store the values of a section
!> \param section_vals the parsed section that will be created
!> \param section the structure of the section that you want to parse
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- RECURSIVE SUBROUTINE section_vals_create(section_vals,section,error)
+ RECURSIVE SUBROUTINE section_vals_create(section_vals,section)
TYPE(section_vals_type), POINTER :: section_vals
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_create', &
routineP = moduleN//':'//routineN
@@ -887,23 +841,23 @@ RECURSIVE SUBROUTINE section_vals_create(section_vals,section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
ALLOCATE(section_vals,stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
last_section_vals_id=last_section_vals_id+1
section_vals%id_nr=last_section_vals_id
section_vals%ref_count=1
- CALL section_retain(section,error=error)
+ CALL section_retain(section)
section_vals%section => section
section%frozen=.TRUE.
ALLOCATE(section_vals%values(-1:section%n_keywords,0),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
ALLOCATE(section_vals%subs_vals(section%n_subsections,1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO i=1,section%n_subsections
NULLIFY(section_vals%subs_vals(i,1)%section_vals)
CALL section_vals_create(section_vals%subs_vals(i,1)%section_vals,&
- section=section%subsections(i)%section,error=error)
+ section=section%subsections(i)%section)
END DO
NULLIFY(section_vals%ibackup)
END SUBROUTINE section_vals_create
@@ -911,13 +865,10 @@ END SUBROUTINE section_vals_create
! *****************************************************************************
!> \brief retains the given section values (see doc/ReferenceCounting.html)
!> \param section_vals the object to retain
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_vals_retain(section_vals,error)
+ SUBROUTINE section_vals_retain(section_vals)
TYPE(section_vals_type), POINTER :: section_vals
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_retain', &
routineP = moduleN//':'//routineN
@@ -925,21 +876,18 @@ SUBROUTINE section_vals_retain(section_vals,error)
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPreconditionNoFail(section_vals%ref_count>0,cp_failure_level,routineP,error)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPreconditionNoFail(section_vals%ref_count>0,cp_failure_level,routineP)
section_vals%ref_count=section_vals%ref_count+1
END SUBROUTINE section_vals_retain
! *****************************************************************************
!> \brief releases the given object
!> \param section_vals the section_vals to release
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- RECURSIVE SUBROUTINE section_vals_release(section_vals, error)
+ RECURSIVE SUBROUTINE section_vals_release(section_vals)
TYPE(section_vals_type), POINTER :: section_vals
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_release', &
routineP = moduleN//':'//routineN
@@ -952,35 +900,34 @@ RECURSIVE SUBROUTINE section_vals_release(section_vals, error)
failure=.FALSE.
IF (ASSOCIATED(section_vals)) THEN
- CPPreconditionNoFail(section_vals%ref_count>0,cp_failure_level,routineP,error)
+ CPPreconditionNoFail(section_vals%ref_count>0,cp_failure_level,routineP)
section_vals%ref_count=section_vals%ref_count-1
IF (section_vals%ref_count==0) THEN
- CALL section_release(section_vals%section,error=error)
+ CALL section_release(section_vals%section)
DO j=1,SIZE(section_vals%values,2)
DO i=-1,UBOUND(section_vals%values,1)
vals => section_vals%values(i,j)%list
- DO WHILE (cp_sll_val_next(vals,el_att=el,error=error))
- CALL val_release(el,error=error)
+ DO WHILE (cp_sll_val_next(vals,el_att=el))
+ CALL val_release(el)
END DO
- CALL cp_sll_val_dealloc(section_vals%values(i,j)%list,error=error)
+ CALL cp_sll_val_dealloc(section_vals%values(i,j)%list)
END DO
END DO
DEALLOCATE(section_vals%values,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
DO j=1,SIZE(section_vals%subs_vals,2)
DO i=1,SIZE(section_vals%subs_vals,1)
- CALL section_vals_release(section_vals%subs_vals(i,j)%section_vals,&
- error=error)
+ CALL section_vals_release(section_vals%subs_vals(i,j)%section_vals)
END DO
END DO
DEALLOCATE(section_vals%subs_vals,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
IF (ASSOCIATED(section_vals%ibackup)) THEN
DEALLOCATE(section_vals%ibackup,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
DEALLOCATE(section_vals,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
END IF
END SUBROUTINE section_vals_release
@@ -995,20 +942,16 @@ END SUBROUTINE section_vals_release
!> (max(1,n_repetition))
!> \param section ...
!> \param explicit if the section was explicitly present in
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
-!>
!> \author fawzi
!> \note For the other arguments see the attributes of section_vals_type
! *****************************************************************************
SUBROUTINE section_vals_get(section_vals, ref_count, id_nr, n_repetition,&
- n_subs_vals_rep,section,explicit, error)
+ n_subs_vals_rep,section,explicit)
TYPE(section_vals_type), POINTER :: section_vals
INTEGER, INTENT(out), OPTIONAL :: ref_count, id_nr, &
n_repetition, n_subs_vals_rep
TYPE(section_type), OPTIONAL, POINTER :: section
LOGICAL, INTENT(out), OPTIONAL :: explicit
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_get', &
routineP = moduleN//':'//routineN
@@ -1017,8 +960,8 @@ SUBROUTINE section_vals_get(section_vals, ref_count, id_nr, n_repetition,&
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
IF (PRESENT(ref_count)) ref_count=section_vals%ref_count
IF (PRESENT(id_nr)) id_nr=section_vals%id_nr
IF (PRESENT(section)) section => section_vals%section
@@ -1034,18 +977,15 @@ END SUBROUTINE section_vals_get
!> \param i_rep_section index of the repetition of section_vals from which
!> you want to extract the subsection (defaults to 1)
!> \param can_return_null if the results can be null (defaults to false)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
RECURSIVE FUNCTION section_vals_get_subs_vals(section_vals,subsection_name,&
- i_rep_section,can_return_null,error) RESULT(res)
+ i_rep_section,can_return_null) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: subsection_name
INTEGER, INTENT(in), OPTIONAL :: i_rep_section
LOGICAL, INTENT(in), OPTIONAL :: can_return_null
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(section_vals_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_get_subs_vals', &
@@ -1056,8 +996,8 @@ RECURSIVE FUNCTION section_vals_get_subs_vals(section_vals,subsection_name,&
my_can_return_null
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
my_can_return_null=.FALSE.
IF (PRESENT(can_return_null)) my_can_return_null=can_return_null
@@ -1076,20 +1016,19 @@ RECURSIVE FUNCTION section_vals_get_subs_vals(section_vals,subsection_name,&
my_index=my_index-1
ENDIF
- CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,error,failure)
+ CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,failure)
- isection=section_get_subsection_index(section_vals%section,subsection_name(1:my_index),&
- error=error)
+ isection=section_get_subsection_index(section_vals%section,subsection_name(1:my_index))
IF (isection>0) res => section_vals%subs_vals(isection,irep)%section_vals
IF(.NOT.(ASSOCIATED(res).OR.my_can_return_null))&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"could not find subsection "//TRIM(subsection_name(1:my_index))//" in section "//&
TRIM(section_vals%section%name)//" at "//&
CPSourceFileRef,&
- error,failure)
+ failure)
IF (is_path .AND. ASSOCIATED(res) ) THEN
res=>section_vals_get_subs_vals(res,subsection_name(my_index+2:LEN_TRIM(subsection_name)),&
- i_rep_section,can_return_null,error)
+ i_rep_section,can_return_null)
ENDIF
END FUNCTION section_vals_get_subs_vals
@@ -1101,16 +1040,13 @@ END FUNCTION section_vals_get_subs_vals
!> \param i_section index of the section
!> \param i_rep_section index of the repetition of section_vals from which
!> you want to extract the subsection (defaults to 1)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
- FUNCTION section_vals_get_subs_vals2(section_vals,i_section,i_rep_section,error) RESULT(res)
+ FUNCTION section_vals_get_subs_vals2(section_vals,i_section,i_rep_section) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
INTEGER, INTENT(in) :: i_section
INTEGER, INTENT(in), OPTIONAL :: i_rep_section
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(section_vals_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_get_subs_vals2', &
@@ -1120,12 +1056,12 @@ FUNCTION section_vals_get_subs_vals2(section_vals,i_section,i_rep_section,error)
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
NULLIFY(res)
irep=1
IF (PRESENT(i_rep_section)) irep=i_rep_section
- CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,error,failure)
+ CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,failure)
isect_att=0
DO i=1,section_vals%section%n_subsections
IF (SIZE(section_vals%subs_vals(i,irep)%section_vals%values,2)>0) THEN
@@ -1145,17 +1081,14 @@ END FUNCTION section_vals_get_subs_vals2
!> \param subsection_name ...
!> \param i_rep_section index of the repetition of section_vals from which
!> you want to extract the subsection (defaults to 1)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
FUNCTION section_vals_get_subs_vals3(section_vals,subsection_name,&
- i_rep_section,error) RESULT(res)
+ i_rep_section) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(LEN=*), INTENT(IN) :: subsection_name
INTEGER, INTENT(in), OPTIONAL :: i_rep_section
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(section_vals_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_get_subs_vals3', &
@@ -1165,26 +1098,23 @@ FUNCTION section_vals_get_subs_vals3(section_vals,subsection_name,&
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
NULLIFY(res)
irep=1
IF (PRESENT(i_rep_section)) irep=i_rep_section
- CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,error,failure)
- i_section = section_get_subsection_index(section_vals%section,subsection_name,error)
+ CPPrecondition(irep<=SIZE(section_vals%subs_vals,2),cp_failure_level,routineP,failure)
+ i_section = section_get_subsection_index(section_vals%section,subsection_name)
res => section_vals%subs_vals(i_section,irep)%section_vals
END FUNCTION section_vals_get_subs_vals3
! *****************************************************************************
!> \brief adds the place to store the values of a repetition of the section
!> \param section_vals the section you want to extend
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_vals_add_values(section_vals,error)
+ SUBROUTINE section_vals_add_values(section_vals)
TYPE(section_vals_type), POINTER :: section_vals
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_add_values', &
routineP = moduleN//':'//routineN
@@ -1198,17 +1128,17 @@ SUBROUTINE section_vals_add_values(section_vals,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
ALLOCATE(new_values(-1:UBOUND(section_vals%values,1),SIZE(section_vals%values,2)+1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO j=1,SIZE(section_vals%values,2)
DO i=-1,UBOUND(section_vals%values,1)
new_values(i,j)%list => section_vals%values(i,j)%list
END DO
END DO
DEALLOCATE(section_vals%values,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
section_vals%values => new_values
j=SIZE ( new_values, 2 )
DO i=-1,UBOUND(new_values,1)
@@ -1218,20 +1148,20 @@ SUBROUTINE section_vals_add_values(section_vals,error)
IF (SIZE(new_values,2)>1) THEN
ALLOCATE(new_sps(SIZE(section_vals%subs_vals,1),&
SIZE(section_vals%subs_vals,2)+1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
DO j=1,SIZE(section_vals%subs_vals,2)
DO i=1,SIZE(section_vals%subs_vals,1)
new_sps(i,j)%section_vals => section_vals%subs_vals(i,j)%section_vals
END DO
END DO
DEALLOCATE(section_vals%subs_vals,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
section_vals%subs_vals => new_sps
j = SIZE ( new_sps, 2 )
DO i=1,SIZE(new_sps,1)
NULLIFY(new_sps(i,j)%section_vals)
CALL section_vals_create(new_sps(i,SIZE(new_sps,2))%section_vals,&
- section=section_vals%section%subsections(i)%section,error=error)
+ section=section_vals%section%subsections(i)%section)
END DO
END IF
END SUBROUTINE section_vals_add_values
@@ -1239,13 +1169,10 @@ END SUBROUTINE section_vals_add_values
! *****************************************************************************
!> \brief removes the values of a repetition of the section
!> \param section_vals the section you want to extend
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE section_vals_remove_values(section_vals,error)
+ SUBROUTINE section_vals_remove_values(section_vals)
TYPE(section_vals_type), POINTER :: section_vals
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_remove_values', &
routineP = moduleN//':'//routineN
@@ -1260,23 +1187,23 @@ SUBROUTINE section_vals_remove_values(section_vals,error)
failure=.FALSE.
IF (ASSOCIATED(section_vals)) THEN
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
NULLIFY(el, vals)
! Allocate a null 0 dimension array of values
ALLOCATE(new_values(-1:section_vals%section%n_keywords,0),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
! Release old values
DO j=1,SIZE(section_vals%values,2)
DO i=-1,UBOUND(section_vals%values,1)
vals => section_vals%values(i,j)%list
- DO WHILE (cp_sll_val_next(vals,el_att=el,error=error))
- CALL val_release(el,error=error)
+ DO WHILE (cp_sll_val_next(vals,el_att=el))
+ CALL val_release(el)
END DO
- CALL cp_sll_val_dealloc(section_vals%values(i,j)%list,error=error)
+ CALL cp_sll_val_dealloc(section_vals%values(i,j)%list)
END DO
END DO
DEALLOCATE(section_vals%values,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
section_vals%values => new_values
END IF
END SUBROUTINE section_vals_remove_values
@@ -1290,17 +1217,15 @@ END SUBROUTINE section_vals_remove_values
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_cval(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_cval(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(LEN=default_string_length) :: res
- CALL section_vals_val_get(section_vals, keyword_name, c_val=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, c_val=res)
END FUNCTION section_get_cval
@@ -1308,17 +1233,15 @@ END FUNCTION section_get_cval
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_rval(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_rval(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
REAL(kind=dp) :: res
- CALL section_vals_val_get(section_vals, keyword_name, r_val=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, r_val=res)
END FUNCTION section_get_rval
@@ -1326,17 +1249,15 @@ END FUNCTION section_get_rval
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_rvals(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_rvals(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
REAL(kind=dp), DIMENSION(:), POINTER :: res
- CALL section_vals_val_get(section_vals, keyword_name, r_vals=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, r_vals=res)
END FUNCTION section_get_rvals
@@ -1344,17 +1265,15 @@ END FUNCTION section_get_rvals
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_ival(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_ival(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
INTEGER :: res
- CALL section_vals_val_get(section_vals, keyword_name, i_val=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, i_val=res)
END FUNCTION section_get_ival
@@ -1362,17 +1281,15 @@ END FUNCTION section_get_ival
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_ivals(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_ivals(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
INTEGER, DIMENSION(:), POINTER :: res
- CALL section_vals_val_get(section_vals, keyword_name, i_vals=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, i_vals=res)
END FUNCTION section_get_ivals
@@ -1380,17 +1297,15 @@ END FUNCTION section_get_ivals
!> \brief ...
!> \param section_vals ...
!> \param keyword_name ...
-!> \param error ...
!> \retval res ...
! *****************************************************************************
- FUNCTION section_get_lval(section_vals,keyword_name,error) RESULT(res)
+ FUNCTION section_get_lval(section_vals,keyword_name) RESULT(res)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
- TYPE(cp_error_type), INTENT(inout) :: error
LOGICAL :: res
- CALL section_vals_val_get(section_vals, keyword_name, l_val=res, error=error)
+ CALL section_vals_val_get(section_vals, keyword_name, l_val=res)
END FUNCTION section_get_lval
@@ -1415,13 +1330,11 @@ END FUNCTION section_get_lval
!> \param r_vals ...
!> \param c_vals ...
!> \param explicit ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
i_rep_val,n_rep_val,val,l_val,i_val,r_val,c_val,l_vals,i_vals,r_vals,&
- c_vals,explicit,error)
+ c_vals,explicit)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
INTEGER, INTENT(in), OPTIONAL :: i_rep_section, i_rep_val
@@ -1438,7 +1351,6 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
CHARACTER(LEN=default_string_length), &
DIMENSION(:), OPTIONAL, POINTER :: c_vals
LOGICAL, INTENT(out), OPTIONAL :: explicit
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_val_get', &
routineP = moduleN//':'//routineN
@@ -1454,8 +1366,8 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
my_index=INDEX(keyword_name,'%')+1
len_key=LEN_TRIM(keyword_name)
@@ -1465,8 +1377,7 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
IF (tmp_index<=0) EXIT
my_index=my_index+tmp_index
END DO
- s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2),&
- error=error)
+ s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2))
ELSE
s_vals=> section_vals
END IF
@@ -1481,22 +1392,22 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
valRequested=PRESENT(l_val).or.PRESENT(i_val).or.PRESENT(r_val).OR.&
PRESENT(c_val).OR.PRESENT(l_vals).or.PRESENT(i_vals).OR.&
PRESENT(r_vals).OR.PRESENT(c_vals)
- ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key),error=error)
+ ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key))
IF(ik==-2) &
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section "//TRIM(section%name)//" does not contain keyword "//&
- TRIM(keyword_name(my_index:len_key)),error,failure)
+ TRIM(keyword_name(my_index:len_key)),failure)
keyword => section%keywords(ik)%keyword
IF(.NOT.(irs>0.AND.irs<=SIZE(s_vals%subs_vals,2)))&
CALL cp_assert(.FALSE., cp_failure_level,cp_assertion_failed,&
routineP,"section repetition requested ("//cp_to_string(irs)//&
") out of bounds (1:"//cp_to_string(SIZE(s_vals%subs_vals,2))&
- //")",error,failure)
+ //")",failure)
NULLIFY(my_val)
IF (PRESENT(n_rep_val)) n_rep_val=0
IF (irs<=SIZE(s_vals%values,2)) THEN ! the section was parsed
vals => s_vals%values(ik,irs)%list
- IF (PRESENT(n_rep_val)) n_rep_val=cp_sll_val_get_length(vals,error=error)
+ IF (PRESENT(n_rep_val)) n_rep_val=cp_sll_val_get_length(vals)
IF (.NOT.ASSOCIATED(vals)) THEN
! this keyword was not parsed
IF (ASSOCIATED(keyword%default_value)) THEN
@@ -1505,7 +1416,7 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
END IF
ELSE
my_val => cp_sll_val_get_el_at(s_vals%values(ik,irs)%list,&
- irk,error=error)
+ irk)
IF (PRESENT(explicit)) explicit = .TRUE.
END IF
ELSE IF (ASSOCIATED(keyword%default_value)) THEN
@@ -1518,10 +1429,10 @@ SUBROUTINE section_vals_val_get(section_vals,keyword_name,i_rep_section,&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"Value requested, but no value set getting value from "//&
"keyword "//TRIM(keyword_name(my_index:len_key))//" of section "//&
- TRIM(section%name),error,failure)
+ TRIM(section%name),failure)
CALL val_get(my_val,l_val=l_val,i_val=i_val,r_val=r_val,&
c_val=c_val,l_vals=l_vals,i_vals=i_vals,r_vals=r_vals,&
- c_vals=c_vals,error=error)
+ c_vals=c_vals)
END IF
END SUBROUTINE section_vals_val_get
@@ -1533,18 +1444,16 @@ END SUBROUTINE section_vals_val_get
!> \param i_rep_section which repetition of the section you are interested in
!> (defaults to 1)
!> \param list ...
-!> \param error ...
!> \author Joost VandeVondele
!> \note
!> - most useful if the full list is needed anyway, so that faster iteration can be used
! *****************************************************************************
SUBROUTINE section_vals_list_get(section_vals,keyword_name,i_rep_section,&
- list,error)
+ list)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
INTEGER, OPTIONAL :: i_rep_section
TYPE(cp_sll_val_type), POINTER :: list
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_list_get', &
routineP = moduleN//':'//routineN
@@ -1557,8 +1466,8 @@ SUBROUTINE section_vals_list_get(section_vals,keyword_name,i_rep_section,&
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
NULLIFY(list)
my_index=INDEX(keyword_name,'%')+1
len_key=LEN_TRIM(keyword_name)
@@ -1568,8 +1477,7 @@ SUBROUTINE section_vals_list_get(section_vals,keyword_name,i_rep_section,&
IF (tmp_index<=0) EXIT
my_index=my_index+tmp_index
END DO
- s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2),&
- error=error)
+ s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2))
ELSE
s_vals=> section_vals
END IF
@@ -1577,16 +1485,16 @@ SUBROUTINE section_vals_list_get(section_vals,keyword_name,i_rep_section,&
irs=1
IF (PRESENT(i_rep_section)) irs=i_rep_section
section => s_vals%section
- ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key),error=error)
+ ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key))
IF(ik==-2)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section "//TRIM(section%name)//" does not contain keyword "//&
- TRIM(keyword_name(my_index:len_key)),error,failure)
+ TRIM(keyword_name(my_index:len_key)),failure)
IF(.NOT.(irs>0.AND.irs<=SIZE(s_vals%subs_vals,2)))&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section repetition requested ("//cp_to_string(irs)//&
") out of bounds (1:"//cp_to_string(SIZE(s_vals%subs_vals,2))&
- //")",error,failure)
+ //")",failure)
list => s_vals%values(ik,irs)%list
END SUBROUTINE section_vals_list_get
@@ -1611,12 +1519,10 @@ END SUBROUTINE section_vals_list_get
!> \param i_vals_ptr ...
!> \param r_vals_ptr ...
!> \param c_vals_ptr ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_val,&
- val,l_val,i_val,r_val,c_val,l_vals_ptr,i_vals_ptr,r_vals_ptr,c_vals_ptr,error)
+ val,l_val,i_val,r_val,c_val,l_vals_ptr,i_vals_ptr,r_vals_ptr,c_vals_ptr)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
INTEGER, INTENT(in), OPTIONAL :: i_rep_section, i_rep_val
@@ -1631,7 +1537,6 @@ SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_va
POINTER :: r_vals_ptr
CHARACTER(LEN=default_string_length), &
DIMENSION(:), OPTIONAL, POINTER :: c_vals_ptr
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_val_set', &
routineP = moduleN//':'//routineN
@@ -1647,8 +1552,8 @@ SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_va
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
my_index=INDEX(keyword_name,'%')+1
len_key=LEN_TRIM(keyword_name)
@@ -1658,8 +1563,7 @@ SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_va
IF (tmp_index<=0) EXIT
my_index=my_index+tmp_index
END DO
- s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2),&
- error=error)
+ s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2))
ELSE
s_vals=> section_vals
END IF
@@ -1669,21 +1573,21 @@ SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_va
IF (PRESENT(i_rep_section)) irs=i_rep_section
IF (PRESENT(i_rep_val)) irk=i_rep_val
section => s_vals%section
- ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key),error=error)
+ ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key))
IF(ik==-2)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section "//TRIM(section%name)//" does not contain keyword "//&
- TRIM(keyword_name(my_index:len_key)),error,failure)
+ TRIM(keyword_name(my_index:len_key)),failure)
! Add values..
DO
IF (irs<=SIZE(s_vals%values,2)) EXIT
- CALL section_vals_add_values(s_vals,error=error)
+ CALL section_vals_add_values(s_vals)
END DO
IF(.NOT.(irs>0.AND.irs<=SIZE(s_vals%subs_vals,2)))&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section repetition requested ("//cp_to_string(irs)//&
") out of bounds (1:"//cp_to_string(SIZE(s_vals%subs_vals,2))&
- //")",error,failure)
+ //")",failure)
keyword => s_vals%section%keywords(ik)%keyword
NULLIFY(my_val)
IF (PRESENT(val)) my_val => val
@@ -1697,47 +1601,46 @@ SUBROUTINE section_vals_val_set(section_vals,keyword_name,i_rep_section,i_rep_va
cp_failure_level,cp_assertion_failed,routineP,&
" both val and values present, in setting "//&
"keyword "//TRIM(keyword_name(my_index:len_key))//" of section "//&
- TRIM(section%name),error,failure)
+ TRIM(section%name),failure)
ELSE
! ignore ?
IF(.NOT.valSet)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
" empty value in setting "//&
"keyword "//TRIM(keyword_name(my_index:len_key))//" of section "//&
- TRIM(section%name),error,failure)
- CPPrecondition(valSet,cp_failure_level,routineP,error,failure)
+ TRIM(section%name),failure)
+ CPPrecondition(valSet,cp_failure_level,routineP,failure)
IF (keyword%type_of_var==lchar_t) THEN
- CALL val_create(my_val, lc_val=c_val, lc_vals_ptr=c_vals_ptr,&
- error=error)
+ CALL val_create(my_val, lc_val=c_val, lc_vals_ptr=c_vals_ptr)
ELSE
CALL val_create(my_val,l_val=l_val,i_val=i_val,r_val=r_val,&
c_val=c_val,l_vals_ptr=l_vals_ptr,i_vals_ptr=i_vals_ptr,&
r_vals_ptr=r_vals_ptr,&
- c_vals_ptr=c_vals_ptr,enum=keyword%enum,error=error)
+ c_vals_ptr=c_vals_ptr,enum=keyword%enum)
END IF
- CPPostcondition(ASSOCIATED(my_val),cp_failure_level,routineP,error,failure)
- CPPostcondition(my_val%type_of_var==keyword%type_of_var,cp_failure_level,routineP,error,failure)
+ CPPostcondition(ASSOCIATED(my_val),cp_failure_level,routineP,failure)
+ CPPostcondition(my_val%type_of_var==keyword%type_of_var,cp_failure_level,routineP,failure)
END IF
vals => s_vals%values(ik,irs)%list
IF (irk==-1) THEN
- CALL cp_sll_val_insert_el_at(vals,my_val,index=-1,error=error)
- ELSE IF (irk <= cp_sll_val_get_length(vals,error)) THEN
+ CALL cp_sll_val_insert_el_at(vals,my_val,index=-1)
+ ELSE IF (irk <= cp_sll_val_get_length(vals)) THEN
IF(irk<=0)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"invalid irk "//TRIM(ADJUSTL(cp_to_string(irk)))//&
" in keyword "//TRIM(keyword_name(my_index:len_key))//" of section "//&
- TRIM(section%name),error,failure)
- old_val => cp_sll_val_get_el_at(vals,index=irk,error=error)
- CALL val_release(old_val,error=error)
- CALL cp_sll_val_set_el_at(vals,value=my_val,index=irk,error=error)
- ELSE IF (irk>cp_sll_val_get_length(vals,error)+1) THEN
+ TRIM(section%name),failure)
+ old_val => cp_sll_val_get_el_at(vals,index=irk)
+ CALL val_release(old_val)
+ CALL cp_sll_val_set_el_at(vals,value=my_val,index=irk)
+ ELSE IF (irk>cp_sll_val_get_length(vals)+1) THEN
! change?
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"cannot add extra keyword repetitions to keyword"&
//TRIM(keyword_name(my_index:len_key))//" of section "//&
- TRIM(section%name),error,failure)
+ TRIM(section%name),failure)
ELSE
- CALL cp_sll_val_insert_el_at(vals,my_val,index=irk,error=error)
+ CALL cp_sll_val_insert_el_at(vals,my_val,index=irk)
END IF
s_vals%values(ik,irs)%list => vals
NULLIFY(my_val)
@@ -1754,16 +1657,13 @@ END SUBROUTINE section_vals_val_set
!> (defaults to 1)
!> \param i_rep_val which repetition of the keyword/val you are interested in
!> (defaults to 1)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_vals_val_unset(section_vals,keyword_name,i_rep_section,&
- i_rep_val,error)
+ i_rep_val)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: keyword_name
INTEGER, INTENT(in), OPTIONAL :: i_rep_section, i_rep_val
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_val_unset', &
routineP = moduleN//':'//routineN
@@ -1778,8 +1678,8 @@ SUBROUTINE section_vals_val_unset(section_vals,keyword_name,i_rep_section,&
failure=.FALSE.
NULLIFY(pos)
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
my_index=INDEX(keyword_name,'%')+1
len_key=LEN_TRIM(keyword_name)
@@ -1789,8 +1689,7 @@ SUBROUTINE section_vals_val_unset(section_vals,keyword_name,i_rep_section,&
IF (tmp_index<=0) EXIT
my_index=my_index+tmp_index
END DO
- s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2),&
- error=error)
+ s_vals => section_vals_get_subs_vals(section_vals,keyword_name(1:my_index-2))
ELSE
s_vals=> section_vals
END IF
@@ -1800,29 +1699,27 @@ SUBROUTINE section_vals_val_unset(section_vals,keyword_name,i_rep_section,&
IF (PRESENT(i_rep_section)) irs=i_rep_section
IF (PRESENT(i_rep_val)) irk=i_rep_val
section => s_vals%section
- ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key),error=error)
+ ik=section_get_keyword_index(s_vals%section,keyword_name(my_index:len_key))
IF(ik==-2)&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section "//TRIM(section%name)//" does not contain keyword "//&
- TRIM(keyword_name(my_index:len_key)),error,failure)
+ TRIM(keyword_name(my_index:len_key)),failure)
! ignore unset of non set values
IF (irs<=SIZE(s_vals%values,2)) THEN
IF(.NOT.(irs>0.AND.irs<=SIZE(s_vals%subs_vals,2)))&
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,routineP,&
"section repetition requested ("//cp_to_string(irs)//&
") out of bounds (1:"//cp_to_string(SIZE(s_vals%subs_vals,2))&
- //")",error,failure)
+ //")",failure)
IF (irk==-1) THEN
- pos => cp_sll_val_get_rest(s_vals%values(ik,irs)%list, iter=-1,error=error)
+ pos => cp_sll_val_get_rest(s_vals%values(ik,irs)%list, iter=-1)
ELSE
- pos => cp_sll_val_get_rest(s_vals%values(ik,irs)%list, iter=irk-1,error=error)
+ pos => cp_sll_val_get_rest(s_vals%values(ik,irs)%list, iter=irk-1)
END IF
IF (ASSOCIATED(pos)) THEN
- old_val => cp_sll_val_get_el_at(s_vals%values(ik,irs)%list,index=irk,&
- error=error)
- CALL val_release(old_val,error=error)
- CALL cp_sll_val_rm_el_at(s_vals%values(ik,irs)%list,index=irk,&
- error=error)
+ old_val => cp_sll_val_get_el_at(s_vals%values(ik,irs)%list,index=irk)
+ CALL val_release(old_val)
+ CALL cp_sll_val_rm_el_at(s_vals%values(ik,irs)%list,index=irk)
END IF
END IF
@@ -1835,17 +1732,14 @@ END SUBROUTINE section_vals_val_unset
!> \param unit_nr the unit where to write to
!> \param hide_root ...
!> \param hide_defaults ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> skips required sections which weren't read
! *****************************************************************************
- RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defaults,error)
+ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defaults)
TYPE(section_vals_type), POINTER :: section_vals
INTEGER, INTENT(in) :: unit_nr
LOGICAL, INTENT(in), OPTIONAL :: hide_root, hide_defaults
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_write', &
routineP = moduleN//':'//routineN
@@ -1869,11 +1763,10 @@ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defa
IF (PRESENT(hide_root)) my_hide_root=hide_root
IF (PRESENT(hide_defaults)) my_hide_defaults=hide_defaults
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
IF ((.NOT.failure).AND.(unit_nr>0)) THEN
- CALL section_vals_get(section_vals, explicit=explicit, n_repetition=nr, section=section,&
- error=error)
+ CALL section_vals_get(section_vals, explicit=explicit, n_repetition=nr, section=section)
IF (explicit.OR.(.NOT.my_hide_defaults)) THEN
DO i_rep_s=1,nr
IF (.NOT.my_hide_root) THEN
@@ -1895,7 +1788,7 @@ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defa
IF (ASSOCIATED(keyword)) THEN
IF (keyword%type_of_var/=no_t.AND.keyword%names(1)(1:2)/="__") THEN
CALL section_vals_val_get(section_vals,keyword%names(1),&
- i_rep_s,n_rep_val=nval,error=error)
+ i_rep_s,n_rep_val=nval)
IF (i_rep_s<=SIZE(section_vals%values,2)) THEN
! Section was parsed
vals => section_vals%values(ik,i_rep_s)%list
@@ -1923,7 +1816,7 @@ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defa
WRITE(unit=unit_nr,fmt="("//TRIM(myfmt)//")",advance="NO")
END IF
CALL val_write(val,unit_nr=unit_nr,unit=keyword%unit,&
- fmt=myfmt,error=error)
+ fmt=myfmt)
END DO
ELSEIF (ASSOCIATED(keyword%default_value)) THEN
! Section was not parsed but default for the keywords may exist
@@ -1938,7 +1831,7 @@ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defa
WRITE(unit=unit_nr,fmt="("//TRIM(myfmt)//")",advance="NO")
END IF
CALL val_write(val,unit_nr=unit_nr,unit=keyword%unit,&
- fmt=myfmt,error=error)
+ fmt=myfmt)
END IF
END IF
END IF
@@ -1948,7 +1841,7 @@ RECURSIVE SUBROUTINE section_vals_write(section_vals,unit_nr,hide_root,hide_defa
DO isec=1,SIZE(section_vals%subs_vals,1)
sval => section_vals%subs_vals(isec,i_rep_s)%section_vals
IF (ASSOCIATED(sval)) THEN
- CALL section_vals_write(sval,unit_nr=unit_nr,hide_defaults=hide_defaults,error=error)
+ CALL section_vals_write(sval,unit_nr=unit_nr,hide_defaults=hide_defaults)
END IF
END DO
END IF
@@ -1969,13 +1862,11 @@ END SUBROUTINE section_vals_write
!> \param section ...
!> \param level ...
!> \param unit_number ...
-!> \param error ...
! *****************************************************************************
- RECURSIVE SUBROUTINE write_section_xml(section,level,unit_number,error)
+ RECURSIVE SUBROUTINE write_section_xml(section,level,unit_number)
TYPE(section_type), POINTER :: section
INTEGER, INTENT(IN) :: level, unit_number
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'write_section_xml', &
routineP = moduleN//':'//routineN
@@ -1989,7 +1880,7 @@ RECURSIVE SUBROUTINE write_section_xml(section,level,unit_number,error)
IF (ASSOCIATED(section)) THEN
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
! Indentation for current level, next level, etc.
@@ -2024,14 +1915,12 @@ RECURSIVE SUBROUTINE write_section_xml(section,level,unit_number,error)
DO i=-1,section%n_keywords
IF (ASSOCIATED(section%keywords(i)%keyword)) THEN
- CALL write_keyword_xml(section%keywords(i)%keyword,l1,unit_number,&
- error)
+ CALL write_keyword_xml(section%keywords(i)%keyword,l1,unit_number)
END IF
END DO
DO i=1,section%n_subsections
- CALL write_section_xml(section%subsections(i)%section,l1,unit_number,&
- error)
+ CALL write_section_xml(section%subsections(i)%section,l1,unit_number)
END DO
WRITE (UNIT=unit_number,FMT="(A)") REPEAT(" ",l0)//""
@@ -2047,10 +1936,9 @@ END SUBROUTINE write_section_xml
!> \param location_string ...
!> \param matching_rank ...
!> \param matching_string ...
-!> \param error ...
! *****************************************************************************
RECURSIVE SUBROUTINE section_typo_match(section,unknown_string,location_string,&
- matching_rank,matching_string,error)
+ matching_rank,matching_string)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*) :: unknown_string, &
@@ -2058,7 +1946,6 @@ RECURSIVE SUBROUTINE section_typo_match(section,unknown_string,location_string,&
INTEGER, DIMENSION(:), INTENT(INOUT) :: matching_rank
CHARACTER(LEN=*), DIMENSION(:), &
INTENT(INOUT) :: matching_string
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'section_typo_match', &
routineP = moduleN//':'//routineN
@@ -2069,7 +1956,7 @@ RECURSIVE SUBROUTINE section_typo_match(section,unknown_string,location_string,&
failure = .FALSE.
IF (ASSOCIATED(section)) THEN
- CPPrecondition(section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(section%ref_count>0,cp_failure_level,routineP,failure)
imatch=typo_match(TRIM(section%name),TRIM(unknown_string))
IF (imatch>0) THEN
WRITE(line,'(T2,A)') " subsection "//TRIM(section%name)//" in section "//TRIM(location_string)
@@ -2089,13 +1976,13 @@ RECURSIVE SUBROUTINE section_typo_match(section,unknown_string,location_string,&
DO i=-1,section%n_keywords
IF (ASSOCIATED(section%keywords(i)%keyword)) THEN
CALL keyword_typo_match(section%keywords(i)%keyword,unknown_string,location_string// &
- "%"//TRIM(section%name),matching_rank,matching_string,error)
+ "%"//TRIM(section%name),matching_rank,matching_string)
END IF
END DO
DO i=1,section%n_subsections
CALL section_typo_match(section%subsections(i)%section,unknown_string,&
- location_string//"%"//TRIM(section%name),matching_rank,matching_string,error)
+ location_string//"%"//TRIM(section%name),matching_rank,matching_string)
END DO
END IF
@@ -2109,17 +1996,14 @@ END SUBROUTINE section_typo_match
!> \param new_section_vals the new section_vals to use
!> \param i_rep_section index of the repetition of section_vals of which
!> you want to replace the subsection (defaults to 1)
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_vals_set_subs_vals(section_vals,subsection_name,&
- new_section_vals,i_rep_section,error)
+ new_section_vals,i_rep_section)
TYPE(section_vals_type), POINTER :: section_vals
CHARACTER(len=*), INTENT(in) :: subsection_name
TYPE(section_vals_type), POINTER :: new_section_vals
INTEGER, INTENT(in), OPTIONAL :: i_rep_section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_set_subs_vals', &
routineP = moduleN//':'//routineN
@@ -2130,10 +2014,10 @@ SUBROUTINE section_vals_set_subs_vals(section_vals,subsection_name,&
TYPE(section_vals_type), POINTER :: s_vals
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(new_section_vals),cp_failure_level,routineP,error,failure)
- CPPrecondition(new_section_vals%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(section_vals%ref_count>0,cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(new_section_vals),cp_failure_level,routineP,failure)
+ CPPrecondition(new_section_vals%ref_count>0,cp_failure_level,routineP,failure)
irep=1
IF (PRESENT(i_rep_section)) irep=i_rep_section
@@ -2146,25 +2030,23 @@ SUBROUTINE section_vals_set_subs_vals(section_vals,subsection_name,&
IF (tmp_index<=0) EXIT
my_index=my_index+tmp_index
END DO
- s_vals => section_vals_get_subs_vals(section_vals,subsection_name(1:my_index-2),&
- error=error)
+ s_vals => section_vals_get_subs_vals(section_vals,subsection_name(1:my_index-2))
ELSE
s_vals=> section_vals
END IF
- CPPrecondition(irep<=SIZE(s_vals%subs_vals,2),cp_failure_level,routineP,error,failure)
+ CPPrecondition(irep<=SIZE(s_vals%subs_vals,2),cp_failure_level,routineP,failure)
- isection=section_get_subsection_index(s_vals%section,subsection_name(my_index:LEN_TRIM(subsection_name)),&
- error=error)
+ isection=section_get_subsection_index(s_vals%section,subsection_name(my_index:LEN_TRIM(subsection_name)))
IF(isection<=0)&
CALL cp_assert(.FALSE.,cp_failure_level,&
cp_assertion_failed,routineP,&
"could not find subsection "//subsection_name(my_index:LEN_TRIM(subsection_name))//" in section "//&
TRIM(section_vals%section%name)//" at "//&
CPSourceFileRef,&
- error,failure)
- CALL section_vals_retain(new_section_vals,error=error)
- CALL section_vals_release(s_vals%subs_vals(isection,irep)%section_vals,error=error)
+ failure)
+ CALL section_vals_retain(new_section_vals)
+ CALL section_vals_release(s_vals%subs_vals(isection,irep)%section_vals)
s_vals%subs_vals(isection,irep)%section_vals => new_section_vals
END SUBROUTINE section_vals_set_subs_vals
@@ -2175,16 +2057,13 @@ END SUBROUTINE section_vals_set_subs_vals
!> \param section_vals_out the section_vals to create
!> \param i_rep_start ...
!> \param i_rep_end ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
SUBROUTINE section_vals_duplicate(section_vals_in,section_vals_out,&
- i_rep_start, i_rep_end, error)
+ i_rep_start, i_rep_end)
TYPE(section_vals_type), POINTER :: section_vals_in, &
section_vals_out
INTEGER, INTENT(IN), OPTIONAL :: i_rep_start, i_rep_end
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_duplicate', &
routineP = moduleN//':'//routineN
@@ -2193,11 +2072,10 @@ SUBROUTINE section_vals_duplicate(section_vals_in,section_vals_out,&
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section_vals_in),cp_failure_level,routineP,error,failure)
- CPPrecondition(.NOT.ASSOCIATED(section_vals_out),cp_failure_level,routineP,error,failure)
- CALL section_vals_create(section_vals_out,section_vals_in%section,&
- error=error)
- CALL section_vals_copy(section_vals_in,section_vals_out,i_rep_start,i_rep_end,error=error)
+ CPPrecondition(ASSOCIATED(section_vals_in),cp_failure_level,routineP,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section_vals_out),cp_failure_level,routineP,failure)
+ CALL section_vals_create(section_vals_out,section_vals_in%section)
+ CALL section_vals_copy(section_vals_in,section_vals_out,i_rep_start,i_rep_end)
END SUBROUTINE section_vals_duplicate
! *****************************************************************************
@@ -2206,18 +2084,15 @@ END SUBROUTINE section_vals_duplicate
!> \param section_vals_out the section_vals where to copy
!> \param i_rep_low ...
!> \param i_rep_high ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> private, only works with a newly initialized section_vals_out
! *****************************************************************************
RECURSIVE SUBROUTINE section_vals_copy(section_vals_in,section_vals_out,&
- i_rep_low,i_rep_high,error)
+ i_rep_low,i_rep_high)
TYPE(section_vals_type), POINTER :: section_vals_in, &
section_vals_out
INTEGER, INTENT(IN), OPTIONAL :: i_rep_low, i_rep_high
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'section_vals_copy', &
routineP = moduleN//':'//routineN
@@ -2230,30 +2105,30 @@ RECURSIVE SUBROUTINE section_vals_copy(section_vals_in,section_vals_out,&
failure=.FALSE.
NULLIFY(v2,el)
- CPPrecondition(ASSOCIATED(section_vals_in),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(section_vals_out),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section_vals_in),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(section_vals_out),cp_failure_level,routineP,failure)
! IF(section_vals_in%section%id_nr/=section_vals_out%section%id_nr)&
! CALL cp_assert(.FALSE., cp_failure_level,cp_assertion_failed,routineP,&
! CPSourceFileRef,&
- ! error,failure)
+ ! failure)
istart = 1
iend = SIZE(section_vals_in%values,2)
IF (PRESENT(i_rep_low)) istart=i_rep_low
IF (PRESENT(i_rep_high)) iend=i_rep_high
DO irep=istart,iend
- CALL section_vals_add_values(section_vals_out,error=error)
+ CALL section_vals_add_values(section_vals_out)
DO ival=LBOUND(section_vals_in%values,1),UBOUND(section_vals_in%values,1)
v1=>section_vals_in%values(ival,irep)%list
IF (ASSOCIATED(v1)) THEN
- CALL val_duplicate(v1%first_el,el,error=error)
- CALL cp_sll_val_create(v2,el,error=error)
+ CALL val_duplicate(v1%first_el,el)
+ CALL cp_sll_val_create(v2,el)
NULLIFY(el)
section_vals_out%values(ival,irep-istart+1)%list => v2
DO
IF (.not.ASSOCIATED(v1%rest)) EXIT
v1 => v1%rest
- CALL val_duplicate(v1%first_el,el,error=error)
- CALL cp_sll_val_create(v2%rest,first_el=el,error=error)
+ CALL val_duplicate(v1%first_el,el)
+ CALL cp_sll_val_create(v2%rest,first_el=el)
NULLIFY(el)
v2 => v2%rest
END DO
@@ -2264,18 +2139,18 @@ RECURSIVE SUBROUTINE section_vals_copy(section_vals_in,section_vals_out,&
CALL cp_assert(SIZE(section_vals_in%values,2)==SIZE(section_vals_out%values,2),&
cp_failure_level,cp_assertion_failed,routineP,&
CPSourceFileRef,&
- error,failure)
+ failure)
CALL cp_assert(SIZE(section_vals_in%subs_vals,2)==SIZE(section_vals_out%subs_vals,2),&
cp_failure_level,cp_assertion_failed,routineP,&
CPSourceFileRef,&
- error,failure)
+ failure)
END IF
iend = SIZE(section_vals_in%subs_vals,2)
IF (PRESENT(i_rep_high)) iend=i_rep_high
DO irep=istart,iend
DO isec=1,SIZE(section_vals_in%subs_vals,1)
CALL section_vals_copy(section_vals_in%subs_vals(isec,irep)%section_vals,&
- section_vals_out%subs_vals(isec,irep-istart+1)%section_vals,error=error)
+ section_vals_out%subs_vals(isec,irep-istart+1)%section_vals)
END DO
END DO
END SUBROUTINE section_vals_copy
diff --git a/src/input/input_val_types.F b/src/input/input_val_types.F
index c72f04fe22..01594bfeac 100644
--- a/src/input/input_val_types.F
+++ b/src/input/input_val_types.F
@@ -94,15 +94,13 @@ MODULE input_val_types
!> \param lc_vals ...
!> \param lc_vals_ptr ...
!> \param enum the enumaration type this value is using
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> using an enumeration only i_val/i_vals/i_vals_ptr are accepted
! *****************************************************************************
SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
r_val,r_vals,r_vals_ptr,c_val,c_vals,c_vals_ptr,lc_val,lc_vals,&
- lc_vals_ptr,enum,error)
+ lc_vals_ptr,enum)
TYPE(val_type), POINTER :: val
LOGICAL, INTENT(in), OPTIONAL :: l_val
LOGICAL, DIMENSION(:), INTENT(in), &
@@ -129,7 +127,6 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
DIMENSION(:), OPTIONAL, POINTER :: lc_vals_ptr
TYPE(enumeration_type), OPTIONAL, &
POINTER :: enum
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_create', &
routineP = moduleN//':'//routineN
@@ -139,9 +136,9 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(val),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(val),cp_failure_level,routineP,failure)
ALLOCATE(val,stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
NULLIFY(val%l_val,val%i_val,val%r_val,val%c_val,val%enum)
val%type_of_var=no_t
last_val_id=last_val_id+1
@@ -151,19 +148,19 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
narg=0
val%type_of_var=no_t
IF (PRESENT(l_val)) THEN
-!FM CPPrecondition(.NOT.PRESENT(l_vals),cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(l_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(l_vals),cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(l_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%l_val(1),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
val%l_val(1)=l_val
val%type_of_var=logical_t
END IF
IF (PRESENT(l_vals)) THEN
-!FM CPPrecondition(.NOT.PRESENT(l_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(l_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%l_val(SIZE(l_vals)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%l_val=l_vals
val%type_of_var=logical_t
END IF
@@ -174,19 +171,19 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
END IF
IF (PRESENT(r_val)) THEN
-!FM CPPrecondition(.NOT.PRESENT(r_vals),cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(r_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(r_vals),cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(r_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%r_val(1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%r_val(1)=r_val
val%type_of_var=real_t
END IF
IF (PRESENT(r_vals)) THEN
-!FM CPPrecondition(.NOT.PRESENT(r_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(r_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%r_val(SIZE(r_vals)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%r_val=r_vals
val%type_of_var=real_t
END IF
@@ -197,19 +194,19 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
END IF
IF (PRESENT(i_val)) THEN
-!FM CPPrecondition(.NOT.PRESENT(i_vals),cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(i_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(i_vals),cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(i_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%i_val(1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%i_val(1)=i_val
val%type_of_var=integer_t
END IF
IF (PRESENT(i_vals)) THEN
-!FM CPPrecondition(.NOT.PRESENT(i_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(i_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%i_val(SIZE(i_vals)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%i_val=i_vals
val%type_of_var=integer_t
END IF
@@ -220,21 +217,21 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
END IF
IF (PRESENT(c_val)) THEN
- CPPrecondition(LEN_TRIM(c_val)<=default_string_length,cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(c_vals),cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(c_vals_ptr),cp_failure_level,routineP,error,failure)
+ CPPrecondition(LEN_TRIM(c_val)<=default_string_length,cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(c_vals),cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(c_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%c_val(1),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%c_val(1)=c_val
val%type_of_var=char_t
END IF
IF (PRESENT(c_vals)) THEN
-!FM CPPrecondition(.NOT.PRESENT(c_vals_ptr),cp_failure_level,routineP,error,failure)
- CPPrecondition(ALL(LEN_TRIM(c_vals)<=default_string_length),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(c_vals_ptr),cp_failure_level,routineP,failure)
+ CPPrecondition(ALL(LEN_TRIM(c_vals)<=default_string_length),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%c_val(SIZE(c_vals)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%c_val=c_vals
val%type_of_var=char_t
END IF
@@ -244,13 +241,13 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
val%type_of_var=char_t
END IF
IF (PRESENT(lc_val)) THEN
-!FM CPPrecondition(.NOT.PRESENT(lc_vals),cp_failure_level,routineP,error,failure)
-!FM CPPrecondition(.NOT.PRESENT(lc_vals_ptr),cp_failure_level,routineP,error,failure)
+!FM CPPrecondition(.NOT.PRESENT(lc_vals),cp_failure_level,routineP,failure)
+!FM CPPrecondition(.NOT.PRESENT(lc_vals_ptr),cp_failure_level,routineP,failure)
narg=narg+1
len_c=LEN_TRIM(lc_val)
nVal=MAX(1,CEILING(REAL(len_c,dp)/80._dp))
ALLOCATE(val%c_val(nVal),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
IF (len_c == 0) THEN
val%c_val(1) = ""
@@ -263,10 +260,10 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
val%type_of_var=lchar_t
END IF
IF (PRESENT(lc_vals)) THEN
- CPPrecondition(ALL(LEN_TRIM(lc_vals)<=default_string_length),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ALL(LEN_TRIM(lc_vals)<=default_string_length),cp_failure_level,routineP,failure)
narg=narg+1
ALLOCATE(val%c_val(SIZE(lc_vals)),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
val%c_val=lc_vals
val%type_of_var=lchar_t
END IF
@@ -275,33 +272,30 @@ SUBROUTINE val_create(val,l_val,l_vals,l_vals_ptr,i_val,i_vals,i_vals_ptr,&
val%c_val => lc_vals_ptr
val%type_of_var=lchar_t
END IF
- CPPostcondition(narg<=1,cp_failure_level,routineP,error,failure)
+ CPPostcondition(narg<=1,cp_failure_level,routineP,failure)
IF (PRESENT(enum)) THEN
IF (ASSOCIATED(enum)) THEN
IF (val%type_of_var/=no_t.AND.val%type_of_var/=integer_t.AND.&
val%type_of_var/=enum_t) THEN
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
IF (ASSOCIATED(val%i_val)) THEN
val%type_of_var=enum_t
val%enum=>enum
- CALL enum_retain(enum,error=error)
+ CALL enum_retain(enum)
END IF
END IF
END IF
- CPPostcondition(ASSOCIATED(val%enum).eqv.val%type_of_var==enum_t,cp_failure_level,routineP,error,failure)
+ CPPostcondition(ASSOCIATED(val%enum).eqv.val%type_of_var==enum_t,cp_failure_level,routineP,failure)
END SUBROUTINE val_create
! *****************************************************************************
!> \brief releases the given val
!> \param val the val to release
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
-SUBROUTINE val_release(val,error)
+SUBROUTINE val_release(val)
TYPE(val_type), POINTER :: val
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_release', &
routineP = moduleN//':'//routineN
@@ -312,29 +306,29 @@ SUBROUTINE val_release(val,error)
failure=.FALSE.
IF (ASSOCIATED(val)) THEN
- CPPreconditionNoFail(val%ref_count>0,cp_failure_level,routineP,error)
+ CPPreconditionNoFail(val%ref_count>0,cp_failure_level,routineP)
val%ref_count=val%ref_count-1
IF (val%ref_count==0) THEN
IF (ASSOCIATED(val%l_val)) THEN
DEALLOCATE(val%l_val,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
IF (ASSOCIATED(val%i_val)) THEN
DEALLOCATE(val%i_val,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
IF (ASSOCIATED(val%r_val)) THEN
DEALLOCATE(val%r_val,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
IF (ASSOCIATED(val%c_val)) THEN
DEALLOCATE(val%c_val,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
- CALL enum_release(val%enum,error=error)
+ CALL enum_release(val%enum)
val%type_of_var=no_t
DEALLOCATE(val,stat=stat)
- CPPostconditionNoFail(stat==0,cp_warning_level,routineP,error)
+ CPPostconditionNoFail(stat==0,cp_warning_level,routineP)
END IF
END IF
NULLIFY(val)
@@ -343,13 +337,10 @@ END SUBROUTINE val_release
! *****************************************************************************
!> \brief retains the given val
!> \param val the val to retain
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
-SUBROUTINE val_retain(val,error)
+SUBROUTINE val_retain(val)
TYPE(val_type), POINTER :: val
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_retain', &
routineP = moduleN//':'//routineN
@@ -358,8 +349,8 @@ SUBROUTINE val_retain(val,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(val),cp_failure_level,routineP,error,failure)
- CPPreconditionNoFail(val%ref_count>0,cp_failure_level,routineP,error)
+ CPPrecondition(ASSOCIATED(val),cp_failure_level,routineP,failure)
+ CPPreconditionNoFail(val%ref_count>0,cp_failure_level,routineP)
val%ref_count=val%ref_count+1
END SUBROUTINE val_retain
@@ -383,8 +374,6 @@ END SUBROUTINE val_retain
!> it might be longet than default_string_length)
!> \param type_of_var ...
!> \param enum ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> using an enumeration only i_val/i_vals/i_vals_ptr are accepted
@@ -392,7 +381,7 @@ END SUBROUTINE val_retain
!> the c_val is too short to contain the string
! *****************************************************************************
SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
- i_vals,r_val,r_vals,c_val,c_vals,len_c,type_of_var,enum,error)
+ i_vals,r_val,r_vals,c_val,c_vals,len_c,type_of_var,enum)
TYPE(val_type), POINTER :: val
LOGICAL, INTENT(out), OPTIONAL :: has_l, has_i, has_r, has_lc, &
has_c, l_val
@@ -408,7 +397,6 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
INTEGER, INTENT(out), OPTIONAL :: len_c, type_of_var
TYPE(enumeration_type), OPTIONAL, &
POINTER :: enum
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_get', &
routineP = moduleN//':'//routineN
@@ -429,10 +417,10 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
IF (SIZE(val%l_val)>0) THEN
l_val=val%l_val(1)
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
END IF
@@ -442,10 +430,10 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
IF (SIZE(val%i_val)>0) THEN
i_val=val%i_val(1)
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
END IF
@@ -455,10 +443,10 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
IF (SIZE(val%r_val)>0) THEN
r_val=val%r_val(1)
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
END IF
@@ -472,7 +460,7 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
LEN_TRIM(val%c_val(SIZE(val%c_val)))
CALL cp_assert(l_out>=l_in,cp_warning_level,cp_assertion_failed,&
routineP,"val_get will truncate value, value beginning with '"//&
- TRIM(val%c_val(1))//"' is too long for variable",error,failure)
+ TRIM(val%c_val(1))//"' is too long for variable",failure)
DO i=1,SIZE(val%c_val)
c_val((i-1)*default_string_length+1:MIN(l_out,i*default_string_length))=&
val%c_val(i)(1:MIN(80,l_out-(i-1)*default_string_length))
@@ -484,20 +472,20 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
l_in=LEN_TRIM(val%c_val(1))
CALL cp_assert(l_out>=l_in,cp_warning_level,cp_assertion_failed,&
routineP,"val_get will truncate value, value '"//&
- TRIM(val%c_val(1))//"' is too long for variable",error,failure)
+ TRIM(val%c_val(1))//"' is too long for variable",failure)
c_val=val%c_val(1)
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
ELSE IF (ASSOCIATED(val%i_val).AND.ASSOCIATED(val%enum)) THEN
IF (SIZE(val%i_val)>0) THEN
- c_val=enum_i2c(val%enum,val%i_val(1),error=error)
+ c_val=enum_i2c(val%enum,val%i_val(1))
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
END IF
@@ -515,7 +503,7 @@ SUBROUTINE val_get(val,has_l,has_i,has_r,has_lc,has_c,l_val,l_vals,i_val,&
END IF
ELSE IF (ASSOCIATED(val%i_val).AND.ASSOCIATED(val%enum)) THEN
IF (SIZE(val%i_val)>0) THEN
- len_c=LEN_TRIM(enum_i2c(val%enum,val%i_val(1),error=error))
+ len_c=LEN_TRIM(enum_i2c(val%enum,val%i_val(1)))
ELSE
len_c=-HUGE(0)
END IF
@@ -538,18 +526,15 @@ END SUBROUTINE val_get
!> (overrides unit_str)
!> \param unit_str the unit of mesure in wich the output should be written
!> \param fmt ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> unit of mesure used only for reals
! *****************************************************************************
-SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
+SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt)
TYPE(val_type), POINTER :: val
INTEGER, INTENT(in) :: unit_nr
TYPE(cp_unit_type), OPTIONAL, POINTER :: unit
CHARACTER(len=*), INTENT(in), OPTIONAL :: unit_str, fmt
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_write', &
routineP = moduleN//':'//routineN
@@ -566,9 +551,9 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
IF (PRESENT(fmt)) myfmt = fmt
IF (PRESENT(unit)) my_unit => unit
IF (ASSOCIATED(my_unit)) THEN
- CALL cp_unit_retain(my_unit,error=error)
+ CALL cp_unit_retain(my_unit)
ELSE IF (PRESENT(unit_str)) THEN
- CALL cp_unit_create(my_unit,unit_str,error=error)
+ CALL cp_unit_create(my_unit,unit_str)
END IF
IF (ASSOCIATED(val)) THEN
SELECT CASE(val%type_of_var)
@@ -583,7 +568,7 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
val%l_val(i)
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (integer_t)
IF (ASSOCIATED(val%i_val)) THEN
@@ -614,7 +599,7 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
i = i + 1
END DO loop_i
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (real_t)
IF (ASSOCIATED(val%r_val)) THEN
@@ -624,14 +609,14 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
WRITE(unit=unit_nr,fmt="("//TRIM(myfmt)//")",advance="NO")
END IF
IF (ASSOCIATED(my_unit)) THEN
- WRITE(rcval,"(ES25.16)")cp_unit_from_cp2k1(val%r_val(i),my_unit,error=error)
+ WRITE(rcval,"(ES25.16)")cp_unit_from_cp2k1(val%r_val(i),my_unit)
ELSE
WRITE(rcval,"(ES25.16)")val%r_val(i)
END IF
WRITE(unit=unit_nr,fmt="(' ',A)",advance="NO")TRIM(rcval)
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (char_t)
IF (ASSOCIATED(val%c_val)) THEN
@@ -654,7 +639,7 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
END IF
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (lchar_t)
IF (ASSOCIATED(val%c_val)) THEN
@@ -666,13 +651,13 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
WRITE(unit=unit_nr,fmt='(a)',advance="NO") TRIM(val%c_val(SIZE(val%c_val)))
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (enum_t)
IF (ASSOCIATED(val%i_val)) THEN
l=0
DO i=1,SIZE(val%i_val)
- c_string=enum_i2c(val%enum,val%i_val(i),error=error)
+ c_string=enum_i2c(val%enum,val%i_val(i))
IF (l>10.AND.l+LEN_TRIM(c_string)>76)THEN
WRITE(unit=unit_nr,fmt="(' ',A)")default_continuation_character
WRITE(unit=unit_nr,fmt="("//TRIM(myfmt)//")",advance="NO")
@@ -683,19 +668,19 @@ SUBROUTINE val_write(val,unit_nr,unit,unit_str,fmt,error)
WRITE(unit=unit_nr,fmt="(' ',a)",advance="NO") TRIM(c_string)
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE(no_t)
WRITE(unit=unit_nr,fmt="(' *empty*')",advance="NO")
CASE default
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
- routineP,"unexpected type_of_var for val ",error,failure)
+ routineP,"unexpected type_of_var for val ",failure)
END SELECT
ELSE
WRITE(unit=unit_nr,fmt="(' *null*')",advance="NO")
END IF
- IF (ASSOCIATED(my_unit)) CALL cp_unit_release(my_unit,error=error)
+ IF (ASSOCIATED(my_unit)) CALL cp_unit_release(my_unit)
WRITE(unit=unit_nr,fmt="()")
END SUBROUTINE val_write
@@ -704,19 +689,17 @@ END SUBROUTINE val_write
!> \param val ...
!> \param string ...
!> \param unit ...
-!> \param error ...
!> \date 10.03.2005
!> \par History
!> 17.01.2006, MK, Optional argument unit for the conversion to the external unit added
!> \author MK
!> \version 1.0
! *****************************************************************************
- SUBROUTINE val_write_internal(val,string,unit,error)
+ SUBROUTINE val_write_internal(val,string,unit)
TYPE(val_type), POINTER :: val
CHARACTER(LEN=*), INTENT(OUT) :: string
TYPE(cp_unit_type), OPTIONAL, POINTER :: unit
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_write_internal', &
routineP = moduleN//':'//routineN
@@ -741,7 +724,7 @@ SUBROUTINE val_write_internal(val,string,unit,error)
WRITE (UNIT=string(2*i-1:),FMT="(L2)") val%l_val(i)
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (integer_t)
IF (ASSOCIATED(val%i_val)) THEN
@@ -749,16 +732,14 @@ SUBROUTINE val_write_internal(val,string,unit,error)
WRITE (UNIT=string(12*i-11:),FMT="(I12)") val%i_val(i)
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (real_t)
IF (ASSOCIATED(val%r_val)) THEN
IF (PRESENT(unit)) THEN
DO i=1,SIZE(val%r_val)
value = cp_unit_from_cp2k(value=val%r_val(i),&
- unit_str=cp_unit_desc(unit=unit,&
- error=error),&
- error=error)
+ unit_str=cp_unit_desc(unit=unit))
WRITE (UNIT=string(16*i-15:),FMT="(ES16.8E3)") value
END DO
ELSE
@@ -767,7 +748,7 @@ SUBROUTINE val_write_internal(val,string,unit,error)
END DO
END IF
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (char_t)
IF (ASSOCIATED(val%c_val)) THEN
@@ -777,26 +758,26 @@ SUBROUTINE val_write_internal(val,string,unit,error)
ipos = ipos + LEN_TRIM(ADJUSTL(val%c_val(i))) + 1
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (lchar_t)
IF (ASSOCIATED(val%c_val)) THEN
- CALL val_get(val,c_val=string,error=error)
+ CALL val_get(val,c_val=string)
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE (enum_t)
IF (ASSOCIATED(val%i_val)) THEN
DO i=1,SIZE(val%i_val)
- enum_string = enum_i2c(val%enum,val%i_val(i),error)
+ enum_string = enum_i2c(val%enum,val%i_val(i))
WRITE (UNIT=string,FMT="(A)") TRIM(ADJUSTL(enum_string))
END DO
ELSE
- CPAssert(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPAssert(.FALSE.,cp_failure_level,routineP,failure)
END IF
CASE default
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
- routineP,"unexpected type_of_var for val ",error,&
+ routineP,"unexpected type_of_var for val ",&
failure)
END SELECT
@@ -808,13 +789,10 @@ END SUBROUTINE val_write_internal
!> \brief creates a copy of the given value
!> \param val_in the value to copy
!> \param val_out the value tha will be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
-SUBROUTINE val_duplicate(val_in,val_out,error)
+SUBROUTINE val_duplicate(val_in,val_out)
TYPE(val_type), POINTER :: val_in, val_out
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'val_duplicate', &
routineP = moduleN//':'//routineN
@@ -823,36 +801,36 @@ SUBROUTINE val_duplicate(val_in,val_out,error)
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(ASSOCIATED(val_in),cp_failure_level,routineP,error,failure)
- CPPrecondition(.NOT.ASSOCIATED(val_out),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(val_in),cp_failure_level,routineP,failure)
+ CPPrecondition(.NOT.ASSOCIATED(val_out),cp_failure_level,routineP,failure)
ALLOCATE(val_out,stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
last_val_id=last_val_id+1
val_out%id_nr=last_val_id
val_out%type_of_var=val_in%type_of_var
val_out%ref_count=1
val_out%enum => val_in%enum
- IF (ASSOCIATED(val_out%enum)) CALL enum_retain(val_out%enum,error=error)
+ IF (ASSOCIATED(val_out%enum)) CALL enum_retain(val_out%enum)
NULLIFY(val_out%l_val,val_out%i_val,val_out%c_val,val_out%r_val)
IF (ASSOCIATED(val_in%l_val)) THEN
ALLOCATE(val_out%l_val(SIZE(val_in%l_val)),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
val_out%l_val=val_in%l_val
END IF
IF (ASSOCIATED(val_in%i_val)) THEN
ALLOCATE(val_out%i_val(SIZE(val_in%i_val)),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
val_out%i_val=val_in%i_val
END IF
IF (ASSOCIATED(val_in%r_val)) THEN
ALLOCATE(val_out%r_val(SIZE(val_in%r_val)),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
val_out%r_val=val_in%r_val
END IF
IF (ASSOCIATED(val_in%c_val)) THEN
ALLOCATE(val_out%c_val(SIZE(val_in%c_val)),stat=stat)
- CPPostcondition(stat==0,cp_fatal_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_fatal_level,routineP,failure)
val_out%c_val=val_in%c_val
END IF
END SUBROUTINE val_duplicate
diff --git a/src/input_cp2k_almo.F b/src/input_cp2k_almo.F
index 5038478007..f6e3f54944 100644
--- a/src/input_cp2k_almo.F
+++ b/src/input_cp2k_almo.F
@@ -47,14 +47,12 @@ MODULE input_cp2k_almo
! *****************************************************************************
!> \brief create the almo scf section
!> \param section ...
-!> \param error ...
!> \par History
!> 2011.05 created [Rustam Z Khaliullin]
!> \author Rustam Z Khaliullin
! *****************************************************************************
-SUBROUTINE create_almo_scf_section(section,error)
+SUBROUTINE create_almo_scf_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_almo_scf_section', &
routineP = moduleN//':'//routineN
@@ -65,22 +63,21 @@ SUBROUTINE create_almo_scf_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"ALMO_SCF",&
description="Settings for a class of efficient linear scaling methods based "//&
"on absolutely localized orbitals"//&
" (ALMOs). ALMO methods are currently restricted to closed-shell molecular systems.",&
n_keywords=4, n_subsections=3, repeats=.FALSE.,&
- citations=(/Khaliullin2013/),&
- error=error)
+ citations=(/Khaliullin2013/))
NULLIFY (keyword)
CALL keyword_create(keyword, name="EPS_FILTER",&
description="Threshold for the matrix sparsity filter",&
- usage="EPS_FILTER 1.e-6", default_r_val=1.e-7_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_FILTER 1.e-6", default_r_val=1.e-7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALMO_SCF_GUESS",&
description="The method to generate initial ALMOs.",&
@@ -91,10 +88,9 @@ SUBROUTINE create_almo_scf_section(section,error)
"keywords outside ALMO options. This kind of calculation is expensive "//&
"and only recommended if ALMO SCF does not converge from the ATOMIC guess.",&
"Superpoisiton of atomic densities."),&
- enum_i_vals=(/molecular_guess,atomic_guess/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/molecular_guess,atomic_guess/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALMO_ALGORITHM",&
description="Specifies the algorithm to update block-diagonal ALMOs during the SCF procedure.",&
@@ -108,10 +104,9 @@ SUBROUTINE create_almo_scf_section(section,error)
!"Recommended if large fragments are present.",&
"Energy minimization with a PCG algorithm controlled by ALMO_OPTIMIZER_PCG."),&
!enum_i_vals=(/almo_scf_diag,almo_scf_dm_sign,almo_scf_pcg/),&
- enum_i_vals=(/almo_scf_diag,almo_scf_pcg/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/almo_scf_diag,almo_scf_pcg/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELOCALIZE_METHOD",&
description="Methods to reintroduce electron delocalization, which is excluded "//&
@@ -131,49 +126,47 @@ SUBROUTINE create_almo_scf_section(section,error)
"Self-consistent treatment of delocalization without spatial restrictions",&
"Single excitation correction followed by full SCF procedure, both without spatial restrictions"),&
enum_i_vals=(/almo_deloc_none,almo_deloc_xalmo_1diag,almo_deloc_xalmo_x,almo_deloc_xalmo_scf,&
- almo_deloc_x,almo_deloc_scf,almo_deloc_x_then_scf/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ almo_deloc_x,almo_deloc_scf,almo_deloc_x_then_scf/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XALMO_R_CUTOFF_FACTOR",&
description="Controls the localization radius of XALMOs: "//&
!"r0 = r0_factor*(radius(at1)+radius(at2)) + r0_shift",&
"R_cutoff = XALMO_R_CUTOFF_FACTOR*(radius(at1)+radius(at2))",&
- usage="XALMO_R_CUTOFF_FACTOR 1.6", default_r_val=1.50_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="XALMO_R_CUTOFF_FACTOR 1.6", default_r_val=1.50_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOCALIZE_EPS_ITER",&
! description="Obsolete and to be deleted: use EPS_ERROR in XALMO_OPTIMIZER_PCG",&
- ! usage="DELOCALIZE_EPS_ITER 1.e-5", default_r_val=1.e-5_dp,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOCALIZE_EPS_ITER 1.e-5", default_r_val=1.e-5_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOCALIZE_EPS_LIN_SEARCH",&
! description="Obsolete and to be deleted: use EPS_ERROR_LIN_SEARCH in XALMO_OPTIMIZER_PCG",&
- ! usage="DELOCALIZE_EPS_LIN_SEARCH 1.e-6", default_r_val=1.e-7_dp,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOCALIZE_EPS_LIN_SEARCH 1.e-6", default_r_val=1.e-7_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="BLOCKED_MAX_ITER",&
! description="Obsolete and to be deleted: use MAX_ITER in ALMO_OPTIMIZER_DIIS or ALMO_OPTIMIZER_PCG",&
- ! usage="BLOCKED_MAX_ITER 200", default_i_val=100,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="BLOCKED_MAX_ITER 200", default_i_val=100)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="BLOCKED_EPS_ITER",&
! description="Obsolete and to be deleted: use EPS_ERROR in ALMO_OPTIMIZER_DIIS or ALMO_OPTIMIZER_PCG",&
- ! usage="BLOCKED_EPS_ITER 1.e-5", default_r_val=1.e-5_dp,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="BLOCKED_EPS_ITER 1.e-5", default_r_val=1.e-5_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOCALIZE_MAX_ITER",&
! description="Obsolete and to be deleted: use MAX_ITER in XALMO_OPTIMIZER_PCG",&
- ! usage="DELOCALIZE_MAX_ITER 200", default_i_val=100,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOCALIZE_MAX_ITER 200", default_i_val=100)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DOMAIN_LAYOUT_MOS",&
! description="Each electron in the system is constrained to its own delocalization domain."//&
@@ -185,10 +178,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! "All electrons of an atom are delocalized over the same domain",&
! "All electrons of a molecule are delocalized over the same domain."//&
! " This is the only implemented option"),&
- ! enum_i_vals=(/almo_domain_layout_orbital,almo_domain_layout_atomic,almo_domain_layout_molecular/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/almo_domain_layout_orbital,almo_domain_layout_atomic,almo_domain_layout_molecular/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DOMAIN_LAYOUT_AOS",&
! description="Atomic orbitals or groups of atomic orbitals represent domains over which electrons "//&
@@ -201,10 +193,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! "Molecular subsets represent domains. That is, if a basis function on a molecule is"//&
! " in domain A then all basis functions on this molecule are in domain A. "//&
! "This is the only implemented option"),&
- ! enum_i_vals=(/almo_domain_layout_atomic,almo_domain_layout_molecular/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/almo_domain_layout_atomic,almo_domain_layout_molecular/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="MATRIX_CLUSTERING_MOS",&
! description="Blocks of matrices in the MO basis set are distributed for parallel computations. "//&
@@ -214,10 +205,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! enum_c_vals=s2a("ATOMIC", "MOLECULAR"),&
! enum_desc=s2a("Not recommended. ZZZ Maybe used for the PAO-based methods in the future",&
! "All molecular orbitals of a molecule belong to the same block."),&
- ! enum_i_vals=(/almo_mat_distr_atomic,almo_mat_distr_molecular/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/almo_mat_distr_atomic,almo_mat_distr_molecular/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="MATRIX_CLUSTERING_AOS",&
! description="Blocks of matrices in the AO basis set are distributed for parallel computations."//&
@@ -229,10 +219,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! "same block. Use only if there are very large molecules in the system. "//&
! "ZZZ Maybe used for the PAO-based methods in the future",&
! "All atomic orbitals of a molecule belong to the same block."),&
- ! enum_i_vals=(/almo_mat_distr_atomic,almo_mat_distr_molecular/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/almo_mat_distr_atomic,almo_mat_distr_molecular/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="CONSTRAINT_TYPE",&
! description="Determines the type of ALMO constraints",&
@@ -243,44 +232,43 @@ SUBROUTINE create_almo_scf_section(section,error)
! "MO coefficients are quenched according to the distance criterion",&
! "MO coefficients are quenched according to the AO overlap criterion"),&
! enum_i_vals=(/almo_constraint_block_diagonal,almo_constraint_distance,&
- ! almo_constraint_ao_overlap/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! almo_constraint_ao_overlap/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="OUTER_MAX_SCF_Q",&
!! description="Maximum number of the outer loop SCF iterations for optimization of quenched ALMOs",&
- !! usage="OUTER_MAX_SCF_Q 10", default_i_val=0,error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="OUTER_MAX_SCF_Q 10", default_i_val=0)
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="EPS_USE_PREV_AS_GUESS",&
!! description="SCF convergence below which quantities from previous iterations"//&
!! " can be used as initial guess for the current iteration.",&
- !! usage="EPS_USE_PREV_AS_GUESS 0.01", default_r_val=0.001_dp,error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="EPS_USE_PREV_AS_GUESS 0.01", default_r_val=0.001_dp)
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="MIXING_FRACTION",&
!! description="Weight of the new KS matrix in the mixing during the SCF procedure.",&
- !! usage="MIXING_FRACTION 0.45", default_r_val=0.45_dp,error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="MIXING_FRACTION 0.45", default_r_val=0.45_dp)
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="FIXED_MU",&
!! description="Fix chemical potential or optimize it to get "//&
!! "the correct number of electrons",&
!! usage="FIXED_MU .TRUE.", default_l_val=.FALSE.,&
- !! lone_keyword_l_val=.TRUE., error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! lone_keyword_l_val=.TRUE.)
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="MU",&
!! description="Value (or initial guess) for the chemical potential."//&
!! " Provide energy between HOMO and LUMO energy.",&
- !! usage="MU 0.0", default_r_val=-0.1_dp,error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="MU 0.0", default_r_val=-0.1_dp)
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="XALMO_ALGORITHM",&
! description="Specifies the algorithm to update ALMOs on eXtended domains (XALMOs).",&
@@ -289,10 +277,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! enum_c_vals=s2a("DDIAG", "PCG"),&
! enum_desc=s2a("Domain diagonalization",&
! "Preconditioned conjugate gradient"),&
- ! enum_i_vals=(/almo_scf_diag,almo_scf_pcg/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/almo_scf_diag,almo_scf_pcg/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="QUENCHER_RADIUS_TYPE",&
! description="Determines the type of atomic radii used for imposing the ALMO constraints",&
@@ -301,65 +288,59 @@ SUBROUTINE create_almo_scf_section(section,error)
! enum_c_vals=s2a("COVALENT", "VDW"),&
! enum_desc=s2a("Covalent atomic radii",&
! "Van der Waals atomic radii"),&
- ! enum_i_vals=(/do_bondparm_covalent,do_bondparm_vdw/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/do_bondparm_covalent,do_bondparm_vdw/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="QUENCHER_R0_FACTOR",&
! description="Parameter to calculate the inner soft cutoff radius: "//&
! !"r0 = r0_factor*(radius(at1)+radius(at2)) + r0_shift",&
! "r0 = r0_factor*(radius(at1)+radius(at2))",&
- ! usage="QUENCHER_R0_FACTOR 1.05", default_r_val=1.05_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="QUENCHER_R0_FACTOR 1.05", default_r_val=1.05_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="QUENCHER_R0_SHIFT",&
!! description="Parameter to calculate the inner soft cutoff radius (in Angstrom): "//&
!! "r0 = r0_factor*(radius(at1)+radius(at2)) + r0_shift",&
- !! usage="QUENCHER_R0_SHIFT 0.0", default_r_val=0.0_dp,&
- !! error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="QUENCHER_R0_SHIFT 0.0", default_r_val=0.0_dp)
+ !!
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="QUENCHER_R1_FACTOR",&
! description="Parameter to calculate the outer soft cutoff radius: "//&
! !"r1 = r1_factor*(radius(at1)+radius(at2)) + r1_shift",&
! "r1 = r1_factor*(radius(at1)+radius(at2))",&
- ! usage="QUENCHER_R1_FACTOR 1.55", default_r_val=1.55_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="QUENCHER_R1_FACTOR 1.55", default_r_val=1.55_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!!CALL keyword_create(keyword, name="QUENCHER_R1_SHIFT",&
!! description="Parameter to calculate the outer soft cutoff radius (in Angstrom): "//&
!! "r1 = r1_factor*(radius(at1)+radius(at2)) + r1_shift",&
- !! usage="QUENCHER_R1_SHIFT 0.0", default_r_val=0.0_dp,&
- !! error=error)
- !!CALL section_add_keyword(section,keyword,error=error)
- !!CALL keyword_release(keyword,error=error)
+ !! usage="QUENCHER_R1_SHIFT 0.0", default_r_val=0.0_dp)
+ !!
+ !!CALL section_add_keyword(section,keyword)
+ !!CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="QUENCHER_AO_OVERLAP_0",&
! description="Overlap value of the inner soft cutoff",&
- ! usage="QUENCHER_AO_OVERLAP_0 1.0E-4", default_r_val=1.0E-4_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="QUENCHER_AO_OVERLAP_0 1.0E-4", default_r_val=1.0E-4_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="QUENCHER_AO_OVERLAP_1",&
! description="Overlap value of the outer soft cutoff",&
- ! usage="QUENCHER_AO_OVERLAP_1 1.0E-6", default_r_val=1.0E-6_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="QUENCHER_AO_OVERLAP_1 1.0E-6", default_r_val=1.0E-6_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="ENVELOPE_AMPLITUDE",&
! description="Defines an upper bound on the maximum norm of the MO coefficients",&
- ! usage="ENVELOPE_AMPLITUDE 1.0", default_r_val=1.0_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="ENVELOPE_AMPLITUDE 1.0", default_r_val=1.0_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_TENSOR_TYPE",&
! description="Tensor properties of occupied and virtual indices",&
@@ -368,10 +349,9 @@ SUBROUTINE create_almo_scf_section(section,error)
! enum_c_vals=s2a("ORTHOGONAL", "BIORTHOGONAL"),&
! enum_desc=s2a("Orthogonalize both occupied and virtual orbitals",&
! "Contravariant virtual (MOs or AOs) and covariant occupied orbitals"),&
- ! enum_i_vals=(/tensor_orthogonal,tensor_up_down/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! enum_i_vals=(/tensor_orthogonal,tensor_up_down/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_CONJUGATOR",&
! description="Various methods to compute step directions in the CG algorithm",&
@@ -385,37 +365,35 @@ SUBROUTINE create_almo_scf_section(section,error)
! "Dai and Yuan","Hager and Zhang"),&
! enum_i_vals=(/cg_zero,cg_polak_ribiere,cg_fletcher_reeves,&
! cg_hestenes_stiefel,cg_fletcher,cg_liu_storey,&
- ! cg_dai_yuan,cg_hager_zhang/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! cg_dai_yuan,cg_hager_zhang/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_MAX_ITER",&
! description="Maximum number of CG iterations to solve Ricatti equations",&
- ! usage="DELOC_CAYLEY_MAX_ITER 100",default_i_val=50,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOC_CAYLEY_MAX_ITER 100",default_i_val=50)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_EPS_CONVERGENCE",&
! description="Convergence criterion of the CG algorithm",&
- ! usage="DELOC_CAYLEY_EPS_CONVERGENCE 1.e-6", default_r_val=1.e-7_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOC_CAYLEY_EPS_CONVERGENCE 1.e-6", default_r_val=1.e-7_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_VIR_PRECOND",&
! description="Use preconditioner for the virtual subspace",&
! usage="DELOC_CAYLEY_VIR_PRECOND .TRUE.", default_l_val=.TRUE.,&
- ! lone_keyword_l_val=.TRUE., error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! lone_keyword_l_val=.TRUE.)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_OCC_PRECOND",&
! description="Use preconditioner for the occupied subspace",&
! usage="DELOC_CAYLEY_OCC_PRECOND .TRUE.", default_l_val=.TRUE.,&
- ! lone_keyword_l_val=.TRUE., error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! lone_keyword_l_val=.TRUE.)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_TRUNCATE_VIRTUALS",&
! description="Truncation of the virtual subspace",&
@@ -427,90 +405,86 @@ SUBROUTINE create_almo_scf_section(section,error)
! "Number of virtuals is equal to the number of occupied orbitals",&
! "Specify exact number of virtuals per domain with DELOC_VIRT_PER_DOMAIN"),&
! enum_i_vals=(/virt_full,virt_minimal,virt_occ_size,&
- ! virt_number/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! virt_number/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_VIRT_PER_DOMAIN",&
! description="Number of virtual orbitals (per domain, atom or molecule) "//&
! "retained to obtain the delocalization correction",&
- ! usage="DELOC_VIRT_PER_DOMAIN",default_i_val=-1,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="DELOC_VIRT_PER_DOMAIN",default_i_val=-1)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_USE_OCC_ORBS",&
! description="Use occupied orbitals (as opposed to density matrix) "//&
! "to calculate correction for electron delocalization",&
! usage="DELOC_USE_OCC_ORBS .TRUE.", default_l_val=.TRUE.,&
- ! lone_keyword_l_val=.TRUE., error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! lone_keyword_l_val=.TRUE.)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_USE_VIRT_ORBS",&
! description="Use virtual orbitals (as opposed to the 1-P projector) "//&
! "to calculate correction for electron delocalization. Works only if "//&
! "DELOC_USE_OCC_ORBS is set to TRUE",&
! usage="DELOC_CAYLEY_USE_VIRT_ORBS .TRUE.", default_l_val=.FALSE.,&
- ! lone_keyword_l_val=.TRUE., error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! lone_keyword_l_val=.TRUE.)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="DELOC_CAYLEY_LINEAR",&
! description="Neglect the quadratic term in the Riccati equations. "//&
! "Equivalent to the first order correction to the occupied orbitals "//&
! "(second order correction to the energy)",&
! usage="DELOC_CAYLEY_LINEAR .FALSE.", default_l_val=.FALSE.,&
- ! lone_keyword_l_val=.TRUE., error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! lone_keyword_l_val=.TRUE.)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_OUTER_MAX_ITER",&
! description="Maximum number of outer loop iterations to optimize retained virtual orbitals",&
- ! usage="OPT_K_OUTER_MAX_ITER 10",default_i_val=1,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_OUTER_MAX_ITER 10",default_i_val=1)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_MAX_ITER",&
! description="Maximum number of iterations to optimize retained virtual orbitals",&
- ! usage="OPT_K_MAX_ITER 100",default_i_val=100,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_MAX_ITER 100",default_i_val=100)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_EPS_CONVERGENCE",&
! description="Convergence criterion of the optimization algorithm",&
- ! usage="OPT_K_EPS_CONVERGENCE 1.e-5", default_r_val=1.e-5_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_EPS_CONVERGENCE 1.e-5", default_r_val=1.e-5_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_TRIAL_STEP_SIZE",&
! description="Size of the trial step along the gradient",&
- ! usage="OPT_K_TRIAL_STEP_SIZE 0.05", default_r_val=0.05_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_TRIAL_STEP_SIZE 0.05", default_r_val=0.05_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_TRIAL_STEP_SIZE_MULTIPLIER",&
! description="The trial step size is obtained by multiplying the optimal step size "//&
! "from the previous iteration",&
- ! usage="OPT_K_TRIAL_STEP_SIZE_multiplier 1.0", default_r_val=1.4_dp,&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_TRIAL_STEP_SIZE_multiplier 1.0", default_r_val=1.4_dp)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_CONJ_ITER_START",&
! description="Iteration for switching from the steepest descent algorithm "//&
! "to conjugate gradient",&
- ! usage="OPT_K_CONJ_ITER_START 5",default_i_val=0,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_CONJ_ITER_START 5",default_i_val=0)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_CONJ_ITER_FREQ_RESET",&
! description="Reset frequency of the conjugate gradient direction",&
- ! usage="OPT_K_CONJ_ITER_FREQ_RESET 20",default_i_val=1000000,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_CONJ_ITER_FREQ_RESET 20",default_i_val=1000000)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_CONJUGATOR",&
! description="Various methods to compute step directions in the CG algorithm",&
@@ -524,43 +498,42 @@ SUBROUTINE create_almo_scf_section(section,error)
! "Dai and Yuan","Hager and Zhang"),&
! enum_i_vals=(/cg_zero,cg_polak_ribiere,cg_fletcher_reeves,&
! cg_hestenes_stiefel,cg_fletcher,cg_liu_storey,&
- ! cg_dai_yuan,cg_hager_zhang/),&
- ! error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! cg_dai_yuan,cg_hager_zhang/))
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_PREC_ITER_START",&
! description="Start using the preconditioner (approximate preconditioners "//&
! "might not be valid on early iterations)",&
- ! usage="OPT_K_PREC_ITER_START 2",default_i_val=0,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_PREC_ITER_START 2",default_i_val=0)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
!CALL keyword_create(keyword, name="OPT_K_PREC_ITER_FREQ_UPDATE",&
! description="Frequency for updating the preconditioner",&
- ! usage="OPT_K_PREC_ITER_FREQ_UPDATE 10",default_i_val=1,error=error)
- !CALL section_add_keyword(section,keyword,error=error)
- !CALL keyword_release(keyword,error=error)
+ ! usage="OPT_K_PREC_ITER_FREQ_UPDATE 10",default_i_val=1)
+ !CALL section_add_keyword(section,keyword)
+ !CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_optimizer_section(subsection,optimizer_block_diagonal_diis,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_optimizer_section(subsection,optimizer_block_diagonal_diis)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_optimizer_section(subsection,optimizer_block_diagonal_pcg,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_optimizer_section(subsection,optimizer_block_diagonal_pcg)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_optimizer_section(subsection,optimizer_xalmo_pcg,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_optimizer_section(subsection,optimizer_xalmo_pcg)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
!NULLIFY(subsection)
- !CALL create_almo_eda_section(subsection,error)
- !CALL section_add_subsection(section, subsection, error=error)
- !CALL section_release(subsection,error=error)
+ !CALL create_almo_eda_section(subsection)
+ !CALL section_add_subsection(section, subsection)
+ !CALL section_release(subsection)
END SUBROUTINE create_almo_scf_section
@@ -568,15 +541,13 @@ END SUBROUTINE create_almo_scf_section
! *****************************************************************************
!> \brief The ALMO EDA section controls decomposition analysis based on ALMOs
!> \param section ...
-!> \param error ...
!> \par History
!> 2014.10 created [Rustam Z Khaliullin]
!> \author Rustam Z Khaliullin
! *****************************************************************************
-SUBROUTINE create_almo_eda_section(section,error)
+SUBROUTINE create_almo_eda_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_almo_eda_section', &
routineP = moduleN//':'//routineN
@@ -586,14 +557,13 @@ SUBROUTINE create_almo_eda_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"ALMO_DA",&
description="Controls decomposition analysis based on ALMOs and XALMOs. "//&
"Not yet fully implemented.",&
n_keywords=1, n_subsections=0, repeats=.FALSE.,&
- citations=(/Khaliullin2007,Khaliullin2008/),&
- error=error)
+ citations=(/Khaliullin2007,Khaliullin2008/))
NULLIFY (keyword)
@@ -609,10 +579,9 @@ SUBROUTINE create_almo_eda_section(section,error)
"Be careful interpreting this term for systems with charged fragmetns."),&
enum_i_vals=(/almo_frz_none,&
! almo_frz_isolated,&
- almo_frz_crystal/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ almo_frz_crystal/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_almo_eda_section
@@ -622,17 +591,15 @@ END SUBROUTINE create_almo_eda_section
!> to all optimization methods (e.g. target error, number of iterations)
!> \param section ...
!> \param optimizer_id - allows to adapt the standard section for specific needs
-!> \param error ...
!> \par History
!> 2012.03 created [Rustam Z Khaliullin]
!> 2014.10 fully integrated [Rustam Z Khaliullin]
!> \author Rustam Z Khaliullin
! *****************************************************************************
-SUBROUTINE create_optimizer_section(section,optimizer_id,error)
+SUBROUTINE create_optimizer_section(section,optimizer_id)
TYPE(section_type), POINTER :: section
INTEGER, INTENT(IN) :: optimizer_id
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_optimizer_section', &
routineP = moduleN//':'//routineN
@@ -643,31 +610,28 @@ SUBROUTINE create_optimizer_section(section,optimizer_id,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
! choose the name of the section
SELECT CASE(optimizer_id)
CASE(optimizer_block_diagonal_diis)
CALL section_create(section,"ALMO_OPTIMIZER_DIIS",&
description="Controls the iterative DIIS-accelerated optimization of block-diagonal ALMOs.",&
- n_keywords=3, n_subsections=0, repeats=.FALSE.,&
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.FALSE.)
optimizer_type=optimizer_diis
CASE(optimizer_block_diagonal_pcg)
CALL section_create(section,"ALMO_OPTIMIZER_PCG",&
description="Controls the PCG optimization of block-diagonal ALMOs.",&
- n_keywords=6, n_subsections=0, repeats=.FALSE.,&
- error=error)
+ n_keywords=6, n_subsections=0, repeats=.FALSE.)
optimizer_type=optimizer_pcg
CASE(optimizer_xalmo_pcg)
CALL section_create(section,"XALMO_OPTIMIZER_PCG",&
description="Controls the PCG optimization of extended ALMOs.",&
- n_keywords=6, n_subsections=0, repeats=.FALSE.,&
- error=error)
+ n_keywords=6, n_subsections=0, repeats=.FALSE.)
optimizer_type=optimizer_pcg
CASE DEFAULT
- CPErrorMessage(cp_failure_level,routineP,"No default values allowed",error)
- CPPrecondition(.FALSE.,cp_failure_level,routineP,error,failure)
+ CPErrorMessage(cp_failure_level,routineP,"No default values allowed")
+ CPPrecondition(.FALSE.,cp_failure_level,routineP,failure)
END SELECT
NULLIFY (keyword)
@@ -675,15 +639,15 @@ SUBROUTINE create_optimizer_section(section,optimizer_id,error)
! add common keywords
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of iterations",&
- usage="MAX_ITER 100", default_i_val=20,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 100", default_i_val=20)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ERROR",&
description="Target value of the MAX norm of the error",&
- usage="EPS_ERROR 1.E-6", default_r_val=1.0E-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_ERROR 1.E-6", default_r_val=1.0E-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! add keywords specific to each type
SELECT CASE(optimizer_type)
@@ -692,31 +656,31 @@ SUBROUTINE create_optimizer_section(section,optimizer_id,error)
CALL keyword_create(keyword, name="N_DIIS",&
description="Number of error vectors to be used in the DIIS "//&
"optimization procedure",&
- usage="N_DIIS 5", default_i_val=6,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="N_DIIS 5", default_i_val=6)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CASE(optimizer_pcg)
CALL keyword_create(keyword, name="LIN_SEARCH_EPS_ERROR",&
description="Target value of the gradient norm during the linear search",&
- usage="LIN_SEARCH_EPS_ERROR 1.E-2", default_r_val=1.0E-3_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LIN_SEARCH_EPS_ERROR 1.E-2", default_r_val=1.0E-3_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LIN_SEARCH_STEP_SIZE_GUESS",&
description="The size of the first step in the linear search",&
- usage="LIN_SEARCH_STEP_SIZE_GUESS 0.1", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LIN_SEARCH_STEP_SIZE_GUESS 0.1", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER_OUTER_LOOP",&
description="Maximum number of iterations in the outer loop. "//&
"Use the outer loop to update the preconditioner and reset the conjugator. "//&
"This can speed up convergence significantly.",&
- usage="MAX_ITER 10", default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 10", default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECONDITIONER",&
description="Select a preconditioner for the conjugate gradient optimization",&
@@ -724,10 +688,9 @@ SUBROUTINE create_optimizer_section(section,optimizer_id,error)
default_i_val=-1,&
enum_c_vals=s2a("DEFAULT", "NONE"),&
enum_desc=s2a("Default preconditioner","Do not use preconditioner"),&
- enum_i_vals=(/prec_default,prec_zero/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/prec_default,prec_zero/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CONJUGATOR",&
description="Various methods to compute step directions in the PCG optimization",&
@@ -741,10 +704,9 @@ SUBROUTINE create_optimizer_section(section,optimizer_id,error)
"Dai and Yuan","Hager and Zhang"),&
enum_i_vals=(/cg_zero,cg_polak_ribiere,cg_fletcher_reeves,&
cg_hestenes_stiefel,cg_fletcher,cg_liu_storey,&
- cg_dai_yuan,cg_hager_zhang/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ cg_dai_yuan,cg_hager_zhang/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SELECT
@@ -761,10 +723,9 @@ END SUBROUTINE create_optimizer_section
!!!> 2014.10 created [Rustam Z Khaliullin]
!!!> \author Rustam Z Khaliullin
!!! *****************************************************************************
-!! SUBROUTINE create_developer_section(section,error)
+!! SUBROUTINE create_developer_section(section)
!!
!! TYPE(section_type), POINTER :: section
-!! TYPE(cp_error_type), INTENT(inout) :: error
!!
!! CHARACTER(len=*), PARAMETER :: routineN = 'create_developer_section', &
!! routineP = moduleN//':'//routineN
@@ -774,15 +735,15 @@ END SUBROUTINE create_optimizer_section
!!
!! failure=.FALSE.
!!
-!! CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+!! CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
!! IF (.NOT. failure) THEN
!!
!! CALL section_create(section,"DEVELOPER",&
!! description="Developer section for all ALMO-based methods. "//&
!! "Allows uninterrupted development of the code "//&
!! "by keeping untested keywords neatly separated from those publicly available",&
-!! n_keywords=3, n_subsections=0, repeats=.FALSE.,&
-!! error=error)
+!! n_keywords=3, n_subsections=0, repeats=.FALSE.)
+!!
!!
!! NULLIFY (keyword)
!!
diff --git a/src/input_cp2k_atom.F b/src/input_cp2k_atom.F
index 1475dd3929..b4d1ba117a 100644
--- a/src/input_cp2k_atom.F
+++ b/src/input_cp2k_atom.F
@@ -54,13 +54,10 @@ MODULE input_cp2k_atom
! *****************************************************************************
!> \brief Creates the input section for the atom code
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_atom_section(section,error)
+ SUBROUTINE create_atom_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atom_section', &
routineP = moduleN//':'//routineN
@@ -71,25 +68,24 @@ SUBROUTINE create_atom_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ATOM",&
description="Section handling input for atomic calculations.",&
- n_keywords=1, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="ATOMIC_NUMBER",&
description="Specify the atomic number",&
- default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ELEMENT",&
description="Specify the element to be calculated",&
usage="ELEMENT char",n_var=1,type_of_var=char_t,&
- default_c_val="H", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="H")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RUN_TYPE",&
description="Type of run that you want to perform "//&
@@ -101,10 +97,9 @@ SUBROUTINE create_atom_section(section,error)
enum_desc=s2a("Perform no run",&
"Perform energy optimization",&
"Perform basis optimization",&
- "Perform pseudopotential optimization"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Perform pseudopotential optimization"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COULOMB_INTEGRALS",&
description="Method to calculate Coulomb integrals",&
@@ -116,10 +111,9 @@ SUBROUTINE create_atom_section(section,error)
enum_i_vals= (/ do_analytic, do_semi_analytic, do_numeric /),&
enum_desc=s2a("Use analytical method",&
"Use semi-analytical method",&
- "Use numerical method"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use numerical method"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCHANGE_INTEGRALS",&
description="Method to calculate Exchange integrals",&
@@ -131,67 +125,66 @@ SUBROUTINE create_atom_section(section,error)
enum_i_vals= (/ do_analytic, do_semi_analytic, do_numeric /),&
enum_desc=s2a("Use analytical method",&
"Use semi-analytical method",&
- "Use numerical method"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use numerical method"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORE",&
description="Specifies the core electrons for a pseudopotential",&
usage="CORE 1s2 ... or CORE [Ne] or CORE none for 0 electron cores", repeats=.FALSE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ELECTRON_CONFIGURATION",&
description="Specifies the electron configuration. "//&
"Optional the multiplicity (m) and a core state [XX] can be declared",&
usage="ELECTRON_CONFIGURATION (1) [Ne] 3s2 ... ", repeats=.TRUE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ANGULAR_MOMENTUM",&
description="Specifies the largest angular momentum calculated [0-3]",&
usage="MAX_ANGULAR_MOMENTUM 3", repeats=.FALSE.,&
- default_i_val=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CALCULATE_STATES",&
description="Specifies the number of states calculated per l value",&
usage="CALCULATE_STATES 5 5 5 3 ", repeats=.FALSE.,&
- default_i_val=0, n_var=-1,type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0, n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_atom_print_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_atom_print_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_atom_aebasis_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_atom_aebasis_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_atom_ppbasis_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_atom_ppbasis_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_atom_method_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_atom_method_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_optimization_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_optimization_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_potential_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_potential_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_powell_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_powell_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_atom_section
@@ -199,13 +192,10 @@ END SUBROUTINE create_atom_section
! *****************************************************************************
!> \brief Create the print atom section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_atom_print_section(section,error)
+ SUBROUTINE create_atom_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atom_print_section', &
routineP = moduleN//':'//routineN
@@ -216,149 +206,132 @@ SUBROUTINE create_atom_print_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options specific of the ATOM code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key, keyword)
CALL cp_print_key_section_create(print_key,"PROGRAM_BANNER",&
description="Controls the printing of the banner of the ATOM program",&
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"METHOD_INFO",&
description="Controls the printing of method information",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"BASIS_SET",&
description="Controls the printing of the basis sets",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"POTENTIAL",&
description="Controls the printing of the potentials",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FIT_DENSITY",&
description="Fit the total electronic density to a linear combination of Gaussian functions",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="NUM_GTO",&
description="Number of Gaussian type functions for density fit",&
usage="NUM_GTO integer ",type_of_var=integer_t,&
- default_i_val=40,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=40)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FIT_KGPOT",&
description="Fit an approximation to the non-additive kinetic energy potential used in KG",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="NUM_GAUSSIAN",&
description="Number of Gaussian terms for the fit",&
usage="NUM_GAUSSIAN integer ",type_of_var=integer_t,&
- default_i_val=1,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_POLYNOM",&
description="Number of terms in the polynomial expansion",&
usage="NUM_POLYNOM integer ",type_of_var=integer_t,&
- default_i_val=4,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=4)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESPONSE_BASIS",&
description="Calculate a response basis set contraction scheme",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="DELTA_CHARGE",&
description="Variation of charge used in finite difference calculation",&
usage="DELTA_CHARGE real ",type_of_var=real_t,&
- default_r_val=0.05_dp,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.05_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DERIVATIVES",&
description="Number of wavefunction derivatives to calculate",&
usage="DERIVATIVES integer ",type_of_var=integer_t,&
- default_i_val=2,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SCF_INFO",&
description="Controls the printing of SCF information",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ORBITALS",&
description="Controls the printing of the optimized orbitals information",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FIT_PSEUDO",&
description="Controls the printing of FIT PSEUDO task",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FIT_BASIS",&
description="Controls the printing of FIT BASIS task",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"UPF_FILE",&
description="Write GTH pseudopotential in UPF format",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ENERGIES_MINUS_KINETIC",&
description="Print out the total energy and orbital energies without " //&
"the kinetic energy component. Useful for atomic calculations used" //&
"during SCPTB parametrization",&
- print_level=debug_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_atom_print_section
! *****************************************************************************
!> \brief Create the all-electron basis section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_atom_aebasis_section(section,error)
+ SUBROUTINE create_atom_aebasis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atom_aebasis_section', &
routineP = moduleN//':'//routineN
@@ -367,26 +340,22 @@ SUBROUTINE create_atom_aebasis_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="AE_BASIS",&
description="Section of basis set information for all-electron calculations.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
- CALL atom_basis_section(section,error)
+ CALL atom_basis_section(section)
END SUBROUTINE create_atom_aebasis_section
! *****************************************************************************
!> \brief Create the pseudopotential basis section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_atom_ppbasis_section(section,error)
+ SUBROUTINE create_atom_ppbasis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atom_ppbasis_section', &
routineP = moduleN//':'//routineN
@@ -395,26 +364,22 @@ SUBROUTINE create_atom_ppbasis_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PP_BASIS",&
description="Section of basis set information for pseudopotential calculations.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
- CALL atom_basis_section(section,error)
+ CALL atom_basis_section(section)
END SUBROUTINE create_atom_ppbasis_section
! *****************************************************************************
!> \brief Keywords in the atom basis section
!> \param section the section to fill
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE atom_basis_section(section,error)
+ SUBROUTINE atom_basis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'atom_basis_section', &
routineP = moduleN//':'//routineN
@@ -425,7 +390,7 @@ SUBROUTINE atom_basis_section(section,error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword)
CALL keyword_create(keyword, name="BASIS_TYPE",&
@@ -442,102 +407,101 @@ SUBROUTINE atom_basis_section(section,error)
"Geometrical Gaussian type orbitals",&
"Contracted Gaussian type orbitals",&
"Slater-type orbitals",&
- "Numerical basis type"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Numerical basis type"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_GTO",&
description="Number of Gaussian type functions for s, p, d, ...",&
usage="NUM_GTO 5 5 5 ",n_var=-1,type_of_var=integer_t,&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_SLATER",&
description="Number of Slater type functions for s, p, d, ...",&
usage="NUM_SLATER 5 5 5 ",n_var=-1,type_of_var=integer_t,&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="START_INDEX",&
description="Starting index for Geometrical Basis sets",&
usage="START_INDEX 0 2 5 4 ",n_var=-1,type_of_var=integer_t,&
- default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="S_EXPONENTS",&
description="Exponents for s functions",&
- usage="S_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="S_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P_EXPONENTS",&
description="Exponents for p functions",&
- usage="P_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="P_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D_EXPONENTS",&
description="Exponents for d functions",&
- usage="D_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="D_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="F_EXPONENTS",&
description="Exponents for f functions",&
- usage="F_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="F_EXPONENTS 1.0 2.0 ... ",n_var=-1,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="S_QUANTUM_NUMBERS",&
description="Main quantum numbers for s functions",&
- usage="S_QUANTUM_NUMBERS 1 2 ... ",n_var=-1,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="S_QUANTUM_NUMBERS 1 2 ... ",n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P_QUANTUM_NUMBERS",&
description="Main quantum numbers for p functions",&
- usage="P_QUANTUM_NUMBERS 2 3 ... ",n_var=-1,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="P_QUANTUM_NUMBERS 2 3 ... ",n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D_QUANTUM_NUMBERS",&
description="Main quantum numbers for d functions",&
- usage="D_QUANTUM_NUMBERS 3 4 ... ",n_var=-1,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="D_QUANTUM_NUMBERS 3 4 ... ",n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="F_QUANTUM_NUMBERS",&
description="Main quantum numbers for f functions",&
- usage="F_QUANTUM_NUMBERS 4 5 ... ",n_var=-1,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="F_QUANTUM_NUMBERS 4 5 ... ",n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GEOMETRICAL_FACTOR",&
description="Geometrical basis: factor C in a*C^k",&
usage="GEOMETRICAL_FACTOR real",&
- default_r_val=2.6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=2.6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GEO_START_VALUE",&
description="Geometrical basis: starting value a in a*C^k",&
usage="GEO_START_VALUE real",&
- default_r_val=0.016_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.016_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIS_SET_FILE_NAME",&
description="Name of the basis set file, may include a path",&
usage="BASIS_SET_FILE_NAME ",&
- default_lc_val="BASIS_SET",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="BASIS_SET")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIS_SET",&
variants=s2a("ORBITAL_BASIS_SET","ORB_BASIS"),&
description="The contracted Gaussian basis set",&
usage="BASIS_SET DZVP", default_c_val=" ", &
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QUADRATURE",&
description="Algorithm to construct the atomic radial grids",&
@@ -547,41 +511,38 @@ SUBROUTINE atom_basis_section(section,error)
enum_desc=s2a("Gauss-Chebyshev quadrature",&
"Transformed Gauss-Chebyshev quadrature",&
"Logarithmic transformed Gauss-Chebyshev quadrature"),&
- default_i_val=do_gapw_log, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_gapw_log)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GRID_POINTS",&
description="Number of radial grid points",&
usage="GRID_POINTS integer",&
- default_i_val=400,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=400)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_EIGENVALUE",&
description="Cutoff of overlap matrix eigenvalues included into basis",&
usage="EPS_EIGENVALUE real",&
- default_r_val=1.e-12_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.e-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_basis_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_basis_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE atom_basis_section
! *****************************************************************************
!> \brief Create the method section for Atom calculations
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_atom_method_section(section,error)
+ SUBROUTINE create_atom_method_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atom_method_section', &
routineP = moduleN//':'//routineN
@@ -593,11 +554,10 @@ SUBROUTINE create_atom_method_section(section,error)
failure=.FALSE.
NULLIFY(subsection,keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="METHOD",&
description="Section of information on method to use.",&
- n_keywords=0, n_subsections=2, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=2, repeats=.TRUE.)
CALL keyword_create(keyword, name="METHOD_TYPE",&
description="Type of electronic structure method to be used",&
@@ -618,10 +578,9 @@ SUBROUTINE create_atom_method_section(section,error)
"Hartree-Fock electronic structure method",&
"Restricted Hartree-Fock electronic structure method",&
"Unrestricted Hartree-Fock electronic structure method",&
- "Restricted open-shell Hartree-Fock electronic structure method"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Restricted open-shell Hartree-Fock electronic structure method"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RELATIVISTIC",&
description="Type of scalar relativistic method to be used",&
@@ -646,23 +605,22 @@ SUBROUTINE create_atom_method_section(section,error)
"Use Douglas-Kroll-Hess Hamiltonian of order 2",&
"Use Douglas-Kroll-Hess Hamiltonian of order 3",&
"Use Douglas-Kroll-Hess Hamiltonian of order 4",&
- "Use Douglas-Kroll-Hess Hamiltonian of order 5"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use Douglas-Kroll-Hess Hamiltonian of order 5"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_xc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_xc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! ZMP creating zubsection for the zmp calculations
- CALL create_zmp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_zmp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_external_vxc(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_external_vxc(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_atom_method_section
@@ -670,12 +628,10 @@ END SUBROUTINE create_atom_method_section
!> \brief Create the ZMP subsection for Atom calculations
!>
!> \param section ...
-!> \param error ...
!> \author D. Varsano [daniele.varsano@nano.cnr.it]
! *****************************************************************************
- SUBROUTINE create_zmp_section(section,error)
+ SUBROUTINE create_zmp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_zmp_section', &
routineP = moduleN//':'//routineN
@@ -687,42 +643,39 @@ SUBROUTINE create_zmp_section(section,error)
failure=.FALSE.
NULLIFY(subsection,keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ZMP",&
description="Section used to specify ZMP Potentials.",&
- n_keywords=3, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="FILE_DENSITY",&
description="Specifies the filename containing the target density ",&
usage="FILE_DENSITY ",&
- type_of_var=char_t,default_c_val="RHO_O.dat", n_var=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t,default_c_val="RHO_O.dat", n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GRID_TOL",&
description="Tolerance in the equivalence of read-grid in ZMP method",&
- usage="GRID_TOL ", default_r_val=1.E-12_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GRID_TOL ", default_r_val=1.E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
description="Parameter used for the constraint in ZMP method",&
- usage="LAMBDA ", default_r_val=10.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LAMBDA ", default_r_val=10.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DM",&
description="read external density from density matrix",&
- usage="DM ", type_of_var=logical_t,default_l_val=.FALSE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DM ", type_of_var=logical_t,default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_zmp_restart_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_zmp_restart_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_zmp_section
@@ -730,12 +683,10 @@ END SUBROUTINE create_zmp_section
!> \brief Create the ZMP restart subsection for Atom calculations
!>
!> \param section ...
-!> \param error ...
!> \author D. Varsano [daniele.varsano@nano.cnr.it]
! *****************************************************************************
- SUBROUTINE create_zmp_restart_section(section,error)
+ SUBROUTINE create_zmp_restart_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_zmp_restart_section', &
routineP = moduleN//':'//routineN
@@ -746,20 +697,18 @@ SUBROUTINE create_zmp_restart_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RESTART",&
description="Section used to specify the restart option in the ZMP"//&
"procedure, and the file that must be read.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="FILE_RESTART",&
description="Specifies the filename containing the restart file density ",&
usage="FILE_RESTART ",&
- type_of_var=char_t,default_c_val="RESTART.wfn", n_var=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t,default_c_val="RESTART.wfn", n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_zmp_restart_section
@@ -767,12 +716,10 @@ END SUBROUTINE create_zmp_restart_section
!> \brief Subroutine to create the external v_xc potential
!>
!> \param section ...
-!> \param error ...
!> \author D. Varsano [daniele.varsano@nano.cnr.it]
! *****************************************************************************
- SUBROUTINE create_external_vxc(section,error)
+ SUBROUTINE create_external_vxc(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_external_vxc', &
routineP = moduleN//':'//routineN
@@ -783,38 +730,34 @@ SUBROUTINE create_external_vxc(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXTERNAL_VXC",&
description="Section used to specify exernal VXC Potentials.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="FILE_VXC",&
description="Specifies the filename containing the external vxc ",&
usage="FILE_VXC ",&
- type_of_var=char_t,default_c_val="VXC.dat", n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t,default_c_val="VXC.dat", n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GRID_TOL",&
description="Tolerance in the equivalence of read-grid in ZMP method",&
- usage="GRID_TOL ", default_r_val=1.E-12_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GRID_TOL ", default_r_val=1.E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_external_vxc
! *****************************************************************************
!> \brief Create the optimization section for Atom calculations
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_optimization_section(section,error)
+ SUBROUTINE create_optimization_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_optimization_section', &
routineP = moduleN//':'//routineN
@@ -825,59 +768,50 @@ SUBROUTINE create_optimization_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="OPTIMIZATION",&
description="Section of information on optimization thresholds and algorithms.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of iterations for optimization",&
- usage="MAX_ITER 50", default_i_val=200,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 50", default_i_val=200)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SCF",&
description="Convergence criterion for SCF",&
- usage="EPS_SCF 1.e-10", default_r_val=1.e-6_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 1.e-10", default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DAMPING",&
description="Damping parameter for extrapolation method",&
- usage="DAMPING 0.4", default_r_val=0.4_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DAMPING 0.4", default_r_val=0.4_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_DIIS",&
description="Starting DIIS method at convergence to EPS_DIIS",&
- usage="EPS_DIIS 0.01", default_r_val=10000._dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DIIS 0.01", default_r_val=10000._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_DIIS",&
description="Maximum number of DIIS vectors",&
- usage="N_DIIS 6", default_i_val=5,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="N_DIIS 6", default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_optimization_section
! *****************************************************************************
!> \brief Create the potential section for Atom calculations
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_potential_section(section,error)
+ SUBROUTINE create_potential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_potential_section', &
routineP = moduleN//':'//routineN
@@ -889,20 +823,18 @@ SUBROUTINE create_potential_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="POTENTIAL",&
description="Section of information on potential.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="CONFINEMENT",&
description="Definition of confinement potential",&
usage="CONFINEMENT prefactor range exponent", &
default_r_vals=(/ 0._dp, 4._dp, 2._dp /),&
- repeats=.FALSE., n_var=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE., n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PSEUDO_TYPE",&
description="Pseudopotential type",&
@@ -912,43 +844,38 @@ SUBROUTINE create_potential_section(section,error)
"GTH "/),&
enum_i_vals= (/ no_pseudo, gth_pseudo /),&
enum_desc=s2a("Do not use pseudopotentials",&
- "Use Goedecker-Teter-Hutter pseudopotentials"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use Goedecker-Teter-Hutter pseudopotentials"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POTENTIAL_FILE_NAME",&
description="Name of the pseudo potential file, may include a path",&
usage="POTENTIAL_FILE_NAME ",&
- default_lc_val="POTENTIAL",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="POTENTIAL")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POTENTIAL_NAME",&
variants=(/ "POT_NAME" /),&
description="The name of the pseudopotential for the defined kind.",&
- usage="POTENTIAL_NAME ", default_c_val=" ", n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="POTENTIAL_NAME ", default_c_val=" ", n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_gthpotential_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gthpotential_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_potential_section
! *****************************************************************************
!> \brief Creates the >H_POTENTIAL section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_gthpotential_section(section,error)
+ SUBROUTINE create_gthpotential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gthpotential_section', &
routineP = moduleN//':'//routineN
@@ -960,26 +887,22 @@ SUBROUTINE create_gthpotential_section(section,error)
CALL section_create(section,name="GTH_POTENTIAL",&
description="Section used to specify Potentials.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="CP2K Pseudo Potential Standard Format (GTH, ALL or KG)",&
- repeats=.TRUE.,type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.,type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_gthpotential_section
! *****************************************************************************
!> \brief Creates the &BASIS section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_basis_section(section,error)
+ SUBROUTINE create_basis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_basis_section', &
routineP = moduleN//':'//routineN
@@ -991,26 +914,22 @@ SUBROUTINE create_basis_section(section,error)
CALL section_create(section,name="basis",&
description="Section used to specify a general basis set for QM calculations.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="CP2K Basis Set Standard Format",repeats=.TRUE.,&
- type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_basis_section
! *****************************************************************************
!> \brief Creates the &POWELL section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_powell_section(section,error)
+ SUBROUTINE create_powell_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_powell_section', &
routineP = moduleN//':'//routineN
@@ -1022,107 +941,106 @@ SUBROUTINE create_powell_section(section,error)
CALL section_create(section,name="powell",&
description="Section defines basic parameters for Powell optimization",&
- n_keywords=4, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=4, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ACCURACY",&
description="Final accuracy requested in optimization (RHOEND)",&
usage="ACCURACY 0.00001",&
- default_r_val=1.e-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEP_SIZE",&
description="Initial step size for search algorithm (RHOBEG)",&
usage="STEP_SIZE 0.005",&
- default_r_val=0.005_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.005_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_FUN",&
description="Maximum number of function evaluations",&
usage="MAX_FUN 1000",&
- default_i_val=5000,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5000)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_POT_VIRTUAL",&
description="Weight for virtual states in pseudopotential optimization",&
usage="WEIGHT_POT_VIRTUAL 1.0",&
- default_r_val=0.01_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.01_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_POT_SEMICORE",&
description="Weight for semi core states in pseudopotential optimization",&
usage="WEIGHT_POT_SEMICORE 1.0",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_POT_VALENCE",&
description="Weight for valence states in pseudopotential optimization",&
usage="WEIGHT_POT_VALENCE 1.0",&
- default_r_val=100.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=100.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_POT_NODE",&
description="Weight for node mismatch in pseudopotential optimization",&
usage="WEIGHT_POT_NODE 1.0",&
- default_r_val=1000.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1000.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_ELECTRON_CONFIGURATION",&
description="Weight for different electronic states in optimization",&
usage="WEIGHT_ELECTRON_CONFIGURATION 1.0 0.1 ...",&
- n_var=-1,type_of_var=real_t, default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=real_t, default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_METHOD",&
description="Weight for different methods in optimization",&
usage="WEIGHT_METHOD 1.0 0.1 ...",&
- n_var=-1,type_of_var=real_t, default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=real_t, default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET_POT_VIRTUAL",&
description="Target accuracy for virtual state eigenvalues in pseudopotential optimization",&
usage="TARGET_POT_VIRTUAL 0.0001",&
- default_r_val=0.001_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET_POT_VALENCE",&
description="Target accuracy for valence state eigenvalues in pseudopotential optimization",&
usage="TARGET_POT_VALENCE 0.0001",&
- default_r_val=0.00001_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.00001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET_POT_SEMICORE",&
description="Target accuracy for semicore state eigenvalues in pseudopotential optimization",&
usage="TARGET_POT_SEMICORE 0.01",&
- default_r_val=0.001_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHT_PSIR0",&
description="Weight for the wavefunctions at r=0 (only occupied states)",&
usage="WEIGHT_PSIR0 0.01",&
- default_r_val=0._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCOV_MULTIPLICATION",&
description="Multiply Rcov integration limit for charge conservation",&
usage="RCOV_MULTIPLICATION 1.10",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_powell_section
diff --git a/src/input_cp2k_atprop.F b/src/input_cp2k_atprop.F
index fdd362d878..37877bae63 100644
--- a/src/input_cp2k_atprop.F
+++ b/src/input_cp2k_atprop.F
@@ -32,13 +32,10 @@ MODULE input_cp2k_atprop
! *****************************************************************************
!> \brief Creates the ATOMIC section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author JHU
! *****************************************************************************
- SUBROUTINE create_atprop_section(section,error)
+ SUBROUTINE create_atprop_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_atprop_section', &
routineP = moduleN//':'//routineN
@@ -48,13 +45,12 @@ SUBROUTINE create_atprop_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ATOMIC",&
description="Controls the calculation of atomic properties. "//&
"Printing is controled by FORCE_EVAL / PRINT / PROGRAM_RUN_INFO",&
repeats=.FALSE., &
- citations=(/Kikuchi2009/),&
- error=error)
+ citations=(/Kikuchi2009/))
NULLIFY(keyword)
@@ -64,10 +60,9 @@ SUBROUTINE create_atprop_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRESSURE",&
description="Calculate atomic pressure tensors ",&
@@ -75,10 +70,9 @@ SUBROUTINE create_atprop_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_atprop_section
diff --git a/src/input_cp2k_binary_restarts.F b/src/input_cp2k_binary_restarts.F
index 27ac571cb4..49c3470be9 100644
--- a/src/input_cp2k_binary_restarts.F
+++ b/src/input_cp2k_binary_restarts.F
@@ -62,21 +62,19 @@ MODULE input_cp2k_binary_restarts
!> \param para_env ...
!> \param subsys_section ...
!> \param binary_file_read ...
-!> \param error ...
!> \par History
!> - Creation (10.02.2011,MK)
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
SUBROUTINE read_binary_coordinates(topology,root_section,para_env,&
- subsys_section,binary_file_read,error)
+ subsys_section,binary_file_read)
TYPE(topology_parameters_type) :: topology
TYPE(section_vals_type), POINTER :: root_section
TYPE(cp_para_env_type), POINTER :: para_env
TYPE(section_vals_type), POINTER :: subsys_section
LOGICAL, INTENT(OUT) :: binary_file_read
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'read_binary_coordinates', &
routineP = moduleN//':'//routineN
@@ -94,15 +92,15 @@ SUBROUTINE read_binary_coordinates(topology,root_section,para_env,&
NULLIFY (logger)
failure = .FALSE.
- CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,error,failure)
- logger => cp_error_get_logger(error)
+ CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,failure)
+ logger => cp_get_default_logger()
binary_file_read = .FALSE.
CALL section_vals_val_get(root_section,"EXT_RESTART%BINARY_RESTART_FILE_NAME",&
- c_val=binary_restart_file_name,error=error)
+ c_val=binary_restart_file_name)
IF (TRIM(ADJUSTL(binary_restart_file_name)) == "") THEN
CALL timestop(handle)
@@ -110,7 +108,7 @@ SUBROUTINE read_binary_coordinates(topology,root_section,para_env,&
END IF
iw = cp_print_key_unit_nr(logger,subsys_section,"PRINT%TOPOLOGY_INFO/XYZ_INFO",&
- extension=".subsysLog",error=error)
+ extension=".subsysLog")
natomkind = 0
natom = 0
@@ -342,21 +340,19 @@ END SUBROUTINE read_binary_coordinates
!> \param root_section ...
!> \param subsys_section ...
!> \param binary_file_read ...
-!> \param error ...
!> \par History
!> - Creation (17.02.2011,MK)
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
SUBROUTINE read_binary_cs_coordinates(prefix,particle_set,root_section,&
- subsys_section,binary_file_read,error)
+ subsys_section,binary_file_read)
CHARACTER(LEN=*), INTENT(IN) :: prefix
TYPE(particle_type), DIMENSION(:), &
POINTER :: particle_set
TYPE(section_vals_type), POINTER :: root_section, subsys_section
LOGICAL, INTENT(OUT) :: binary_file_read
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'read_binary_cs_coordinates', &
routineP = moduleN//':'//routineN
@@ -378,9 +374,9 @@ SUBROUTINE read_binary_cs_coordinates(prefix,particle_set,root_section,&
NULLIFY (logger)
failure = .FALSE.
- CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,error,failure)
- logger => cp_error_get_logger(error)
+ CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,failure)
+ logger => cp_get_default_logger()
para_env => logger%para_env
binary_file_read = .FALSE.
@@ -394,7 +390,7 @@ SUBROUTINE read_binary_cs_coordinates(prefix,particle_set,root_section,&
END IF
CALL section_vals_val_get(root_section,"EXT_RESTART%BINARY_RESTART_FILE_NAME",&
- c_val=binary_restart_file_name,error=error)
+ c_val=binary_restart_file_name)
IF (TRIM(ADJUSTL(binary_restart_file_name)) == "") THEN
CALL timestop(handle)
@@ -402,7 +398,7 @@ SUBROUTINE read_binary_cs_coordinates(prefix,particle_set,root_section,&
END IF
iw = cp_print_key_unit_nr(logger,subsys_section,"PRINT%TOPOLOGY_INFO/XYZ_INFO",&
- extension=".subsysLog",error=error)
+ extension=".subsysLog")
section_name = prefix//" COORDINATES"
@@ -485,7 +481,7 @@ SUBROUTINE read_binary_cs_coordinates(prefix,particle_set,root_section,&
RETURN
END IF
- CPPrecondition((nparticle > 0),cp_failure_level,routineP,error,failure)
+ CPPrecondition((nparticle > 0),cp_failure_level,routineP,failure)
ALLOCATE (rbuf(3,nparticle),STAT=istat)
IF (istat /= 0) CALL stop_memory(routineN,moduleN,__LINE__,&
@@ -567,14 +563,13 @@ END SUBROUTINE read_binary_cs_coordinates
!> \param para_env ...
!> \param subsys_section ...
!> \param binary_file_read ...
-!> \param error ...
!> \par History
!> - Creation (17.02.2011,MK)
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
SUBROUTINE read_binary_velocities(prefix,particle_set,root_section,para_env,&
- subsys_section,binary_file_read,error)
+ subsys_section,binary_file_read)
CHARACTER(LEN=*), INTENT(IN) :: prefix
TYPE(particle_type), DIMENSION(:), &
@@ -583,7 +578,6 @@ SUBROUTINE read_binary_velocities(prefix,particle_set,root_section,para_env,&
TYPE(cp_para_env_type), POINTER :: para_env
TYPE(section_vals_type), POINTER :: subsys_section
LOGICAL, INTENT(OUT) :: binary_file_read
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'read_binary_velocities', &
routineP = moduleN//':'//routineN
@@ -603,15 +597,15 @@ SUBROUTINE read_binary_velocities(prefix,particle_set,root_section,para_env,&
NULLIFY (logger)
failure = .FALSE.
- CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,error,failure)
- logger => cp_error_get_logger(error)
+ CPPrecondition(ASSOCIATED(root_section),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(subsys_section),cp_failure_level,routineP,failure)
+ logger => cp_get_default_logger()
binary_file_read = .FALSE.
CALL section_vals_val_get(root_section,"EXT_RESTART%BINARY_RESTART_FILE_NAME",&
- c_val=binary_restart_file_name,error=error)
+ c_val=binary_restart_file_name)
IF (TRIM(ADJUSTL(binary_restart_file_name)) == "") THEN
CALL timestop(handle)
@@ -619,7 +613,7 @@ SUBROUTINE read_binary_velocities(prefix,particle_set,root_section,para_env,&
END IF
iw = cp_print_key_unit_nr(logger,subsys_section,"PRINT%TOPOLOGY_INFO/XYZ_INFO",&
- extension=".subsysLog",error=error)
+ extension=".subsysLog")
IF (LEN_TRIM(prefix) == 0) THEN
section_name = "VELOCITIES"
@@ -769,21 +763,19 @@ END SUBROUTINE read_binary_velocities
!> \param binary_restart_file_name ...
!> \param restart ...
!> \param para_env ...
-!> \param error ...
!> \par History
!> - Creation (28.02.2011,MK)
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
SUBROUTINE read_binary_thermostats_nose(prefix,nhc,binary_restart_file_name,&
- restart,para_env,error)
+ restart,para_env)
CHARACTER(LEN=*), INTENT(IN) :: prefix
TYPE(lnhc_parameters_type), POINTER :: nhc
CHARACTER(LEN=*), INTENT(IN) :: binary_restart_file_name
LOGICAL, INTENT(OUT) :: restart
TYPE(cp_para_env_type), POINTER :: para_env
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'read_binary_thermostats_nose', &
routineP = moduleN//':'//routineN
@@ -799,12 +791,12 @@ SUBROUTINE read_binary_thermostats_nose(prefix,nhc,binary_restart_file_name,&
CALL timeset(routineN,handle)
failure = .FALSE.
- CPPrecondition(ASSOCIATED(nhc),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(nhc),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(para_env),cp_failure_level,routineP,failure)
! Set to .TRUE. for debug mode, i.e. all data read are written to stdout
NULLIFY (logger)
- logger => cp_error_get_logger(error)
+ logger => cp_get_default_logger()
output_unit = cp_logger_get_default_io_unit(logger)
IF (logger%iter_info%print_level >= debug_print_level) THEN
diff --git a/src/input_cp2k_check.F b/src/input_cp2k_check.F
index 50e8e1fe3f..ab39385c27 100644
--- a/src/input_cp2k_check.F
+++ b/src/input_cp2k_check.F
@@ -58,18 +58,15 @@ MODULE input_cp2k_check
!> \param input_file the parsed input
!> \param para_env ...
!> \param output_unit ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
!> \note
!> at the moment does nothing
! *****************************************************************************
- SUBROUTINE check_cp2k_input(input_declaration,input_file,para_env,output_unit,error)
+ SUBROUTINE check_cp2k_input(input_declaration,input_file,para_env,output_unit)
TYPE(section_type), POINTER :: input_declaration
TYPE(section_vals_type), POINTER :: input_file
TYPE(cp_para_env_type), POINTER :: para_env
INTEGER, INTENT(IN), OPTIONAL :: output_unit
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'check_cp2k_input', &
routineP = moduleN//':'//routineN
@@ -83,23 +80,23 @@ SUBROUTINE check_cp2k_input(input_declaration,input_file,para_env,output_unit,er
CALL timeset(routineN,handle)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(input_file),cp_failure_level,routineP,error,failure)
- CPPrecondition(input_file%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(input_file),cp_failure_level,routineP,failure)
+ CPPrecondition(input_file%ref_count>0,cp_failure_level,routineP,failure)
! ext_restart
IF(PRESENT(output_unit)) &
- CALL handle_ext_restart(input_declaration, input_file,para_env,output_unit,error)
+ CALL handle_ext_restart(input_declaration, input_file,para_env,output_unit)
! checks on force_eval section
- sections => section_vals_get_subs_vals(input_file,"FORCE_EVAL",error=error)
- CALL section_vals_get(sections, n_repetition=nforce_eval, error=error)
+ sections => section_vals_get_subs_vals(input_file,"FORCE_EVAL")
+ CALL section_vals_get(sections, n_repetition=nforce_eval)
! multiple force_eval only if present RESPA or MIXED calculation is performed
- section2 => section_vals_get_subs_vals(input_file,"MOTION%MD%RESPA",error=error)
- CALL section_vals_get(section2,explicit=explicit,error=error)
+ section2 => section_vals_get_subs_vals(input_file,"MOTION%MD%RESPA")
+ CALL section_vals_get(section2,explicit=explicit)
DO iforce_eval=1,nforce_eval
section3 =>section_vals_get_subs_vals(sections,"MIXED",&
- i_rep_section=iforce_eval,error=error)
- CALL section_vals_get(section3,explicit=explicit_mix,error=error)
+ i_rep_section=iforce_eval)
+ CALL section_vals_get(section3,explicit=explicit_mix)
IF(explicit_mix)EXIT
END DO
@@ -107,23 +104,23 @@ SUBROUTINE check_cp2k_input(input_declaration,input_file,para_env,output_unit,er
IF((explicit_mix.AND.(nforce_eval==1)).OR.(.NOT.explicit_mix.AND.(nforce_eval>1)))THEN
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"Error multiple force_env without RESPA or MIXED, or RESPA with one single "//&
- " or MIXED with only two force_env section.",error,failure)
+ " or MIXED with only two force_env section.",failure)
END IF
END IF
DO iforce_eval = 1,nforce_eval
- section => section_vals_get_subs_vals3(sections,"DFT",i_rep_section=iforce_eval,error=error)
+ section => section_vals_get_subs_vals3(sections,"DFT",i_rep_section=iforce_eval)
! xc: expand and fix default for tddfpt
- section1 => section_vals_get_subs_vals(section,"XC",error=error)
- section2 => section_vals_get_subs_vals(section,"XC%XC_FUNCTIONAL",error=error)
- CALL xc_functionals_expand(section2,section1,error=error)
- section1 => section_vals_get_subs_vals(section,"TDDFPT%XC",error=error)
- section2 => section_vals_get_subs_vals(section,"TDDFPT%XC%XC_FUNCTIONAL",error=error)
- CALL section_vals_get(section2,explicit=explicit,error=error)
+ section1 => section_vals_get_subs_vals(section,"XC")
+ section2 => section_vals_get_subs_vals(section,"XC%XC_FUNCTIONAL")
+ CALL xc_functionals_expand(section2,section1)
+ section1 => section_vals_get_subs_vals(section,"TDDFPT%XC")
+ section2 => section_vals_get_subs_vals(section,"TDDFPT%XC%XC_FUNCTIONAL")
+ CALL section_vals_get(section2,explicit=explicit)
IF (explicit) THEN
- CALL xc_functionals_expand(section2,section1,error=error)
+ CALL xc_functionals_expand(section2,section1)
ELSE
- section2 => section_vals_get_subs_vals(section,"XC%XC_FUNCTIONAL",error=error)
- CALL section_vals_set_subs_vals(section,"TDDFPT%XC%XC_FUNCTIONAL",section2,error=error)
+ section2 => section_vals_get_subs_vals(section,"XC%XC_FUNCTIONAL")
+ CALL section_vals_set_subs_vals(section,"TDDFPT%XC%XC_FUNCTIONAL",section2)
END IF
END DO
@@ -134,13 +131,10 @@ END SUBROUTINE check_cp2k_input
!> \brief expand a shortcutted functional section
!> \param functionals the functional section to expand
!> \param xc_section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE xc_functionals_expand(functionals,xc_section,error)
+ SUBROUTINE xc_functionals_expand(functionals,xc_section)
TYPE(section_vals_type), POINTER :: functionals, xc_section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'xc_functionals_expand', &
routineP = moduleN//':'//routineN
@@ -151,127 +145,127 @@ SUBROUTINE xc_functionals_expand(functionals,xc_section,error)
failure=.FALSE.
CALL section_vals_val_get(functionals,"_SECTION_PARAMETERS_",&
- i_val=shortcut,error=error)
+ i_val=shortcut)
SELECT CASE(shortcut)
CASE(xc_funct_no_shortcut, xc_none)
! nothing to expand
CASE(xc_funct_pbe0)
CALL section_vals_val_set(functionals,"PBE%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"PBE%SCALE_X",&
- r_val=0.75_dp,error=error)
+ r_val=0.75_dp)
CALL section_vals_val_set(functionals,"PBE%SCALE_C",&
- r_val=1.0_dp,error=error)
+ r_val=1.0_dp)
! Hartree Fock Exact Exchange
CALL section_vals_val_set(xc_section,"HF%FRACTION",&
- r_val=0.25_dp,error=error)
+ r_val=0.25_dp)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_beefvdw)
CALL section_vals_val_set(functionals,"PBE%_SECTION_PARAMETERS_",& !40% PBEc
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"PBE%SCALE_C",&
- r_val=0.3998335231_dp,error=error)
+ r_val=0.3998335231_dp)
CALL section_vals_val_set(functionals,"PBE%SCALE_X",& !no PBEx
- r_val=0.0000000000_dp,error=error)
+ r_val=0.0000000000_dp)
!PW92 correlation functional from libxc is required.
!The cp2k-native PW92 gives disagreeing results (in the 0.01E_H
!decimal) and yields inconsistent forces in a DEBUG run.
!(rk, 6.3.2014)
CALL section_vals_val_set(functionals,"LIBXC%_SECTION_PARAMETERS_",& !60%LDA
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"LIBXC%FUNCTIONAL",&
- c_val="LDA_C_PW",error=error)
+ c_val="LDA_C_PW")
CALL section_vals_val_set(functionals,"LIBXC%SCALE",&
- r_val=0.6001664769_dp,error=error)
+ r_val=0.6001664769_dp)
CALL section_vals_val_set(functionals,"BEEF%_SECTION_PARAMETERS_",& !BEEF exchange
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
!NONLOCAL, LMKLL.
CALL section_vals_val_set(xc_section,"VDW_POTENTIAL%DISPERSION_FUNCTIONAL",&
- i_val=xc_vdw_fun_nonloc,error=error)
+ i_val=xc_vdw_fun_nonloc)
CALL section_vals_val_set(xc_section,"VDW_POTENTIAL%NON_LOCAL%TYPE",&
- i_val=vdw_nl_LMKLL,error=error)
+ i_val=vdw_nl_LMKLL)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_b3lyp)
CALL section_vals_val_set(functionals,"BECKE88%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"BECKE88%SCALE_X",&
- r_val=0.72_dp,error=error)
+ r_val=0.72_dp)
CALL section_vals_val_set(functionals,"LYP%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"LYP%SCALE_C",&
- r_val=0.81_dp,error=error)
+ r_val=0.81_dp)
CALL section_vals_val_set(functionals,"VWN%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"VWN%FUNCTIONAL_TYPE",&
- i_val=do_vwn5,error=error)
+ i_val=do_vwn5)
CALL section_vals_val_set(functionals,"VWN%SCALE_C",&
- r_val=0.19_dp,error=error)
+ r_val=0.19_dp)
CALL section_vals_val_set(functionals,"XALPHA%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"XALPHA%SCALE_X",&
- r_val=0.08_dp,error=error)
+ r_val=0.08_dp)
! Hartree Fock Exact Exchange
CALL section_vals_val_set(xc_section,"HF%FRACTION",&
- r_val=0.20_dp,error=error)
+ r_val=0.20_dp)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_blyp)
CALL section_vals_val_set(functionals,"BECKE88%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"LYP%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_bp)
CALL section_vals_val_set(functionals,"BECKE88%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"P86C%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_pade)
CALL section_vals_val_set(functionals,"PADE%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_pbe)
CALL section_vals_val_set(functionals,"PBE%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_xwpbe)
CALL section_vals_val_set(functionals,"XWPBE%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_tpss)
CALL section_vals_val_set(functionals,"TPSS%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_olyp)
CALL section_vals_val_set(functionals,"OPTX%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"LYP%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE(xc_funct_hcth120)
CALL section_vals_val_set(functionals,"HCTH%_SECTION_PARAMETERS_",&
- l_val=.TRUE.,error=error)
+ l_val=.TRUE.)
CALL section_vals_val_set(functionals,"HCTH%PARAMETER_SET",&
- i_val=120,error=error)
+ i_val=120)
CALL section_vals_val_set(functionals,"_SECTION_PARAMETERS_",&
- i_val=xc_funct_no_shortcut,error=error)
+ i_val=xc_funct_no_shortcut)
CASE default
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"unknown shortcut "//TRIM(ADJUSTL(cp_to_string(shortcut))),&
- error,failure)
+ failure)
END SELECT
END SUBROUTINE xc_functionals_expand
@@ -282,16 +276,13 @@ END SUBROUTINE xc_functionals_expand
!> \param input_file the input file to initialize
!> \param para_env ...
!> \param output_unit ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE handle_ext_restart(input_declaration, input_file,para_env,output_unit,error)
+ SUBROUTINE handle_ext_restart(input_declaration, input_file,para_env,output_unit)
TYPE(section_type), POINTER :: input_declaration
TYPE(section_vals_type), POINTER :: input_file
TYPE(cp_para_env_type), POINTER :: para_env
INTEGER, INTENT(IN) :: output_unit
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'handle_ext_restart', &
routineP = moduleN//':'//routineN
@@ -325,112 +316,109 @@ SUBROUTINE handle_ext_restart(input_declaration, input_file,para_env,output_unit
failure=.FALSE.
IF (.NOT. failure) THEN
! Handle restart file
- r_section => section_vals_get_subs_vals(input_file, "EXT_RESTART",error=error)
- CALL section_vals_val_get(r_section,"RESTART_FILE_NAME", c_val=r_file_path, error=error)
- CALL section_vals_val_get(r_section,"BINARY_RESTART_FILE_NAME",c_val=binary_restart_file,&
- error=error)
+ r_section => section_vals_get_subs_vals(input_file, "EXT_RESTART")
+ CALL section_vals_val_get(r_section,"RESTART_FILE_NAME", c_val=r_file_path)
+ CALL section_vals_val_get(r_section,"BINARY_RESTART_FILE_NAME",c_val=binary_restart_file)
IF (r_file_path/=" ") THEN
! parse the input
NULLIFY(default_units,restart_file)
- CALL section_vals_create(restart_file,input_declaration, error=error)
+ CALL section_vals_create(restart_file,input_declaration)
NULLIFY(cpparser)
- CALL parser_create(cpparser,file_name=r_file_path,para_env=para_env,error=error)
- CALL cp_unit_set_create(default_units, "OUTPUT",error=error)
+ CALL parser_create(cpparser,file_name=r_file_path,para_env=para_env)
+ CALL cp_unit_set_create(default_units, "OUTPUT")
CALL section_vals_parse(restart_file,cpparser,root_section=.FALSE.,&
- default_units=default_units,error=error)
- CALL cp_unit_set_release(default_units,error=error)
- CALL parser_release(cpparser,error=error)
+ default_units=default_units)
+ CALL cp_unit_set_release(default_units)
+ CALL parser_release(cpparser)
! Restart and input files same number of force_env sections
- sections1 => section_vals_get_subs_vals(restart_file,"FORCE_EVAL",error=error)
- CALL section_vals_get(sections1, n_repetition=nforce_eval1, error=error)
- sections2 => section_vals_get_subs_vals(input_file,"FORCE_EVAL",error=error)
- CALL section_vals_get(sections2, n_repetition=nforce_eval2, error=error)
+ sections1 => section_vals_get_subs_vals(restart_file,"FORCE_EVAL")
+ CALL section_vals_get(sections1, n_repetition=nforce_eval1)
+ sections2 => section_vals_get_subs_vals(input_file,"FORCE_EVAL")
+ CALL section_vals_get(sections2, n_repetition=nforce_eval2)
IF (nforce_eval1/=nforce_eval2) THEN
CALL cp_assert(.FALSE.,cp_failure_level,cp_assertion_failed,&
routineP,"Restart and input file MUST have the number of force_env sections",&
- error,failure)
+ failure)
END IF
! Handle default restarts
- CALL handle_defaults_restart(r_section, error=error)
+ CALL handle_defaults_restart(r_section)
! Real restart of force_evals
DO iforce_eval = 1, nforce_eval1
section1 => section_vals_get_subs_vals3(sections1,"SUBSYS",&
- i_rep_section=iforce_eval,error=error)
+ i_rep_section=iforce_eval)
section2 => section_vals_get_subs_vals3(sections2,"SUBSYS",&
- i_rep_section=iforce_eval,error=error)
+ i_rep_section=iforce_eval)
! Some care needs to be handled when treating multiple force_eval
! Both subsys need to be consistently associated or not
! Mixed stuff will be rejected for safety reason..
subsys_check = (ASSOCIATED(section1).EQV.ASSOCIATED(section2))
IF (subsys_check) THEN
IF (ASSOCIATED(section1)) THEN
- CALL section_vals_val_get(r_section,"RESTART_CELL",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_CELL",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"CELL",error=error)
- CALL section_vals_set_subs_vals(section2,"CELL",section,error=error)
- CALL set_restart_info("CELL",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"CELL")
+ CALL section_vals_set_subs_vals(section2,"CELL",section)
+ CALL set_restart_info("CELL",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_POS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_POS",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"COORD",error=error)
- CALL section_vals_set_subs_vals(section2,"COORD",section,error=error)
- CALL set_restart_info("COORDINATES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"COORD")
+ CALL section_vals_set_subs_vals(section2,"COORD",section)
+ CALL set_restart_info("COORDINATES",restarted_infos)
! Copy over also the information on the multiple_unit_cell
- CALL section_vals_val_get(section1,"TOPOLOGY%MULTIPLE_UNIT_CELL",i_vals=ivec,&
- error=error)
+ CALL section_vals_val_get(section1,"TOPOLOGY%MULTIPLE_UNIT_CELL",i_vals=ivec)
ALLOCATE(iwork(3),stat=stat)
- CPPrecondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(stat==0,cp_failure_level,routineP,failure)
iwork=ivec
- CALL section_vals_val_set(section2,"TOPOLOGY%MULTIPLE_UNIT_CELL",i_vals_ptr=iwork,&
- error=error)
+ CALL section_vals_val_set(section2,"TOPOLOGY%MULTIPLE_UNIT_CELL",i_vals_ptr=iwork)
END IF
- CALL section_vals_val_get(r_section,"RESTART_RANDOMG",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_RANDOMG",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"RNG_INIT",error=error)
- CALL section_vals_set_subs_vals(section2,"RNG_INIT",section,error=error)
- CALL set_restart_info("RANDOM NUMBER GENERATOR",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"RNG_INIT")
+ CALL section_vals_set_subs_vals(section2,"RNG_INIT",section)
+ CALL set_restart_info("RANDOM NUMBER GENERATOR",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_VEL",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_VEL",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"VELOCITY",error=error)
- CALL section_vals_set_subs_vals(section2,"VELOCITY",section,error=error)
- CALL set_restart_info("VELOCITIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"VELOCITY")
+ CALL section_vals_set_subs_vals(section2,"VELOCITY",section)
+ CALL set_restart_info("VELOCITIES",restarted_infos)
END IF
! Core-Shell information "restarted" only when strictly necessary
- CALL section_vals_val_get(r_section,"RESTART_SHELL_POS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_SHELL_POS",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"SHELL_COORD",error=error)
- CALL section_vals_set_subs_vals(section2,"SHELL_COORD",section,error=error)
- IF (check_restart(section1, section2, "SHELL_COORD",error)) &
- CALL set_restart_info("SHELL COORDINATES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"SHELL_COORD")
+ CALL section_vals_set_subs_vals(section2,"SHELL_COORD",section)
+ IF (check_restart(section1, section2, "SHELL_COORD")) &
+ CALL set_restart_info("SHELL COORDINATES",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_CORE_POS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_CORE_POS",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"CORE_COORD",error=error)
- CALL section_vals_set_subs_vals(section2,"CORE_COORD",section,error=error)
- IF (check_restart(section1, section2, "CORE_COORD",error)) &
- CALL set_restart_info("CORE COORDINATES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"CORE_COORD")
+ CALL section_vals_set_subs_vals(section2,"CORE_COORD",section)
+ IF (check_restart(section1, section2, "CORE_COORD")) &
+ CALL set_restart_info("CORE COORDINATES",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_SHELL_VELOCITY",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_SHELL_VELOCITY",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"SHELL_VELOCITY",error=error)
- CALL section_vals_set_subs_vals(section2,"SHELL_VELOCITY",section,error=error)
- IF (check_restart(section1, section2, "SHELL_VELOCITY",error)) &
- CALL set_restart_info("SHELL VELOCITIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"SHELL_VELOCITY")
+ CALL section_vals_set_subs_vals(section2,"SHELL_VELOCITY",section)
+ IF (check_restart(section1, section2, "SHELL_VELOCITY")) &
+ CALL set_restart_info("SHELL VELOCITIES",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_CORE_VELOCITY",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_CORE_VELOCITY",l_val=flag)
IF (flag) THEN
- section => section_vals_get_subs_vals(section1,"CORE_VELOCITY",error=error)
- CALL section_vals_set_subs_vals(section2,"CORE_VELOCITY",section,error=error)
- IF (check_restart(section1, section2, "CORE_VELOCITY",error)) &
- CALL set_restart_info("CORE VELOCITIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"CORE_VELOCITY")
+ CALL section_vals_set_subs_vals(section2,"CORE_VELOCITY",section)
+ IF (check_restart(section1, section2, "CORE_VELOCITY")) &
+ CALL set_restart_info("CORE VELOCITIES",restarted_infos)
END IF
END IF
ELSE
@@ -438,355 +426,355 @@ SUBROUTINE handle_ext_restart(input_declaration, input_file,para_env,output_unit
routineP,"Error while reading the restart file. Two force_eval have incompatible"//&
" subsys.One of them has an allocated subsys while the other has not! Check your"//&
" input file or whether the restart file is compatible with the input!",&
- error,failure)
+ failure)
END IF
! QMMM restarts
- CALL section_vals_val_get(r_section,"RESTART_QMMM",l_val=flag,error=error)
- section1 => section_vals_get_subs_vals3(sections1,"QMMM",i_rep_section=iforce_eval,error=error)
- section2 => section_vals_get_subs_vals3(sections2,"QMMM",i_rep_section=iforce_eval,error=error)
- CALL section_vals_get(section1,explicit=explicit1,error=error)
- CALL section_vals_get(section2,explicit=explicit2,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_QMMM",l_val=flag)
+ section1 => section_vals_get_subs_vals3(sections1,"QMMM",i_rep_section=iforce_eval)
+ section2 => section_vals_get_subs_vals3(sections2,"QMMM",i_rep_section=iforce_eval)
+ CALL section_vals_get(section1,explicit=explicit1)
+ CALL section_vals_get(section2,explicit=explicit2)
qmmm_check = (explicit1.AND.explicit2)
IF (flag.AND.qmmm_check) THEN
- CALL set_restart_info("QMMM TRANSLATION VECTOR",restarted_infos,error)
- CALL section_vals_val_get(section1,"INITIAL_TRANSLATION_VECTOR",r_vals=vec,error=error)
+ CALL set_restart_info("QMMM TRANSLATION VECTOR",restarted_infos)
+ CALL section_vals_val_get(section1,"INITIAL_TRANSLATION_VECTOR",r_vals=vec)
ALLOCATE(work(3),stat=stat)
- CPPrecondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(stat==0,cp_failure_level,routineP,failure)
work = vec
- CALL section_vals_val_set(section2,"INITIAL_TRANSLATION_VECTOR",r_vals_ptr=work,error=error)
+ CALL section_vals_val_set(section2,"INITIAL_TRANSLATION_VECTOR",r_vals_ptr=work)
END IF
! BSSE restarts
- CALL section_vals_val_get(r_section,"RESTART_BSSE",l_val=flag,error=error)
- section1 => section_vals_get_subs_vals3(sections1,"BSSE",i_rep_section=iforce_eval,error=error)
- section2 => section_vals_get_subs_vals3(sections2,"BSSE",i_rep_section=iforce_eval,error=error)
- CALL section_vals_get(section1,explicit=explicit1,error=error)
- CALL section_vals_get(section2,explicit=explicit2,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_BSSE",l_val=flag)
+ section1 => section_vals_get_subs_vals3(sections1,"BSSE",i_rep_section=iforce_eval)
+ section2 => section_vals_get_subs_vals3(sections2,"BSSE",i_rep_section=iforce_eval)
+ CALL section_vals_get(section1,explicit=explicit1)
+ CALL section_vals_get(section2,explicit=explicit2)
bsse_check = (explicit1.AND.explicit2)
IF (flag.AND.bsse_check) THEN
- section => section_vals_get_subs_vals(section1,"FRAGMENT_ENERGIES",error=error)
- CALL section_vals_set_subs_vals(section2,"FRAGMENT_ENERGIES",section,error=error)
- CALL set_restart_info("BSSE FRAGMENT ENERGIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(section1,"FRAGMENT_ENERGIES")
+ CALL section_vals_set_subs_vals(section2,"FRAGMENT_ENERGIES",section)
+ CALL set_restart_info("BSSE FRAGMENT ENERGIES",restarted_infos)
END IF
END DO
- CALL section_vals_val_get(r_section,"RESTART_COUNTERS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_COUNTERS",l_val=flag)
IF (flag) THEN
- IF (check_restart(input_file, restart_file, "MOTION%MD",error)) THEN
- CALL section_vals_val_get(restart_file,"MOTION%MD%STEP_START_VAL",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%MD%STEP_START_VAL",i_val=myi,error=error)
- CALL section_vals_val_get(restart_file,"MOTION%MD%TIME_START_VAL",r_val=myt,error=error)
- CALL section_vals_val_set(input_file,"MOTION%MD%TIME_START_VAL",r_val=myt,error=error)
- CALL section_vals_val_get(restart_file,"MOTION%MD%ECONS_START_VAL",r_val=myt,error=error)
- CALL section_vals_val_set(input_file,"MOTION%MD%ECONS_START_VAL",r_val=myt,error=error)
- CALL set_restart_info("MD COUNTERS",restarted_infos,error)
+ IF (check_restart(input_file, restart_file, "MOTION%MD")) THEN
+ CALL section_vals_val_get(restart_file,"MOTION%MD%STEP_START_VAL",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%MD%STEP_START_VAL",i_val=myi)
+ CALL section_vals_val_get(restart_file,"MOTION%MD%TIME_START_VAL",r_val=myt)
+ CALL section_vals_val_set(input_file,"MOTION%MD%TIME_START_VAL",r_val=myt)
+ CALL section_vals_val_get(restart_file,"MOTION%MD%ECONS_START_VAL",r_val=myt)
+ CALL section_vals_val_set(input_file,"MOTION%MD%ECONS_START_VAL",r_val=myt)
+ CALL set_restart_info("MD COUNTERS",restarted_infos)
END IF
!
- IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT",error)) THEN
+ IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT")) THEN
! GEO_OPT
- CALL section_vals_val_get(restart_file,"MOTION%GEO_OPT%STEP_START_VAL",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%GEO_OPT%STEP_START_VAL",i_val=myi,error=error)
- CALL set_restart_info("GEO_OPT COUNTERS",restarted_infos,error)
+ CALL section_vals_val_get(restart_file,"MOTION%GEO_OPT%STEP_START_VAL",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%GEO_OPT%STEP_START_VAL",i_val=myi)
+ CALL set_restart_info("GEO_OPT COUNTERS",restarted_infos)
! ROT_OPT
- IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT%TRANSITION_STATE%DIMER%ROT_OPT",error)) THEN
+ IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT%TRANSITION_STATE%DIMER%ROT_OPT")) THEN
CALL section_vals_val_get(restart_file,"MOTION%GEO_OPT%TRANSITION_STATE%DIMER%ROT_OPT%STEP_START_VAL",&
- i_val=myi,error=error)
+ i_val=myi)
CALL section_vals_val_set(input_file,"MOTION%GEO_OPT%TRANSITION_STATE%DIMER%ROT_OPT%STEP_START_VAL",&
- i_val=myi,error=error)
- CALL set_restart_info("ROT_OPT COUNTERS",restarted_infos,error)
+ i_val=myi)
+ CALL set_restart_info("ROT_OPT COUNTERS",restarted_infos)
END IF
END IF
!
- IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT",error)) THEN
+ IF (check_restart(input_file, restart_file, "MOTION%GEO_OPT")) THEN
! CELL_OPT
- CALL section_vals_val_get(restart_file,"MOTION%CELL_OPT%STEP_START_VAL",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%CELL_OPT%STEP_START_VAL",i_val=myi,error=error)
- CALL set_restart_info("CELL_OPT COUNTERS",restarted_infos,error)
+ CALL section_vals_val_get(restart_file,"MOTION%CELL_OPT%STEP_START_VAL",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%CELL_OPT%STEP_START_VAL",i_val=myi)
+ CALL set_restart_info("CELL_OPT COUNTERS",restarted_infos)
END IF
!
- IF (check_restart(input_file, restart_file, "OPTIMIZE_INPUT",error)) THEN
- CALL section_vals_val_get(restart_file,"OPTIMIZE_INPUT%ITER_START_VAL",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"OPTIMIZE_INPUT%ITER_START_VAL",i_val=myi,error=error)
- CALL set_restart_info("OPTIMIZE_INPUT ITERATION NUMBER",restarted_infos,error)
+ IF (check_restart(input_file, restart_file, "OPTIMIZE_INPUT")) THEN
+ CALL section_vals_val_get(restart_file,"OPTIMIZE_INPUT%ITER_START_VAL",i_val=myi)
+ CALL section_vals_val_set(input_file,"OPTIMIZE_INPUT%ITER_START_VAL",i_val=myi)
+ CALL set_restart_info("OPTIMIZE_INPUT ITERATION NUMBER",restarted_infos)
END IF
!
- IF (check_restart(input_file, restart_file, "MOTION%PINT",error)) THEN
+ IF (check_restart(input_file, restart_file, "MOTION%PINT")) THEN
! PINT
- CALL section_vals_val_get(restart_file,"MOTION%PINT%ITERATION",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%ITERATION",i_val=myi,error=error)
- CALL set_restart_info("PINT ITERATION NUMBER",restarted_infos,error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%ITERATION",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%ITERATION",i_val=myi)
+ CALL set_restart_info("PINT ITERATION NUMBER",restarted_infos)
END IF
!
- CALL section_vals_val_get(r_section,"RESTART_METADYNAMICS",l_val=flag2,error=error)
- IF (flag2.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_METADYNAMICS",l_val=flag2)
+ IF (flag2.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN")) THEN
CALL section_vals_val_get(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%STEP_START_VAL",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%STEP_START_VAL",i_val=myi)
CALL section_vals_val_set(input_file,&
- "MOTION%FREE_ENERGY%METADYN%STEP_START_VAL",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%STEP_START_VAL",i_val=myi)
CALL section_vals_val_get(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%NHILLS_START_VAL",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%NHILLS_START_VAL",i_val=myi)
CALL section_vals_val_set(input_file,&
- "MOTION%FREE_ENERGY%METADYN%NHILLS_START_VAL",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%NHILLS_START_VAL",i_val=myi)
!RG Adaptive hills
CALL section_vals_val_get(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%OLD_HILL_NUMBER",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%OLD_HILL_NUMBER",i_val=myi)
CALL section_vals_val_set(input_file,&
- "MOTION%FREE_ENERGY%METADYN%OLD_HILL_NUMBER",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%OLD_HILL_NUMBER",i_val=myi)
CALL section_vals_val_get(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%OLD_HILL_STEP",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%OLD_HILL_STEP",i_val=myi)
CALL section_vals_val_set(input_file,&
- "MOTION%FREE_ENERGY%METADYN%OLD_HILL_STEP",i_val=myi,error=error)
+ "MOTION%FREE_ENERGY%METADYN%OLD_HILL_STEP",i_val=myi)
!RG Adaptive hills
- CALL set_restart_info("METADYNAMIC COUNTERS",restarted_infos,error)
+ CALL set_restart_info("METADYNAMIC COUNTERS",restarted_infos)
END IF
END IF
- CALL section_vals_val_get(r_section,"RESTART_AVERAGES",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_AVERAGES",l_val=flag)
IF (flag) THEN
- IF (check_restart(input_file, restart_file, "MOTION%MD",error)) THEN
- rep_sections => section_vals_get_subs_vals(restart_file,"MOTION%MD%AVERAGES%RESTART_AVERAGES",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%MD%AVERAGES%RESTART_AVERAGES",rep_sections,error=error)
- CALL set_restart_info("MD AVERAGES",restarted_infos,error)
+ IF (check_restart(input_file, restart_file, "MOTION%MD")) THEN
+ rep_sections => section_vals_get_subs_vals(restart_file,"MOTION%MD%AVERAGES%RESTART_AVERAGES")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%MD%AVERAGES%RESTART_AVERAGES",rep_sections)
+ CALL set_restart_info("MD AVERAGES",restarted_infos)
END IF
END IF
- CALL section_vals_val_get(r_section,"RESTART_BAND",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%BAND",error)) THEN
- rep_sections => section_vals_get_subs_vals(restart_file,"MOTION%BAND%REPLICA",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%BAND%REPLICA",rep_sections,error=error)
- CALL set_restart_info("BAND CALCULATION",restarted_infos,error)
+ CALL section_vals_val_get(r_section,"RESTART_BAND",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%BAND")) THEN
+ rep_sections => section_vals_get_subs_vals(restart_file,"MOTION%BAND%REPLICA")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%BAND%REPLICA",rep_sections)
+ CALL set_restart_info("BAND CALCULATION",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_OPTIMIZE_INPUT_VARIABLES",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "OPTIMIZE_INPUT%VARIABLE",error)) THEN
- rep_sections => section_vals_get_subs_vals(restart_file,"OPTIMIZE_INPUT%VARIABLE",error=error)
- CALL section_vals_set_subs_vals(input_file,"OPTIMIZE_INPUT%VARIABLE",rep_sections,error=error)
- CALL set_restart_info("OPTIMIZE_INPUT: VARIABLES",restarted_infos,error)
+ CALL section_vals_val_get(r_section,"RESTART_OPTIMIZE_INPUT_VARIABLES",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "OPTIMIZE_INPUT%VARIABLE")) THEN
+ rep_sections => section_vals_get_subs_vals(restart_file,"OPTIMIZE_INPUT%VARIABLE")
+ CALL section_vals_set_subs_vals(input_file,"OPTIMIZE_INPUT%VARIABLE",rep_sections)
+ CALL set_restart_info("OPTIMIZE_INPUT: VARIABLES",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_BAROSTAT",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%MD%BAROSTAT",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_BAROSTAT",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%MD%BAROSTAT")) THEN
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%MD%BAROSTAT%MASS",error=error)
+ "MOTION%MD%BAROSTAT%MASS")
CALL section_vals_set_subs_vals(input_file,"MOTION%MD%BAROSTAT%MASS",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%MD%BAROSTAT%VELOCITY",error=error)
+ "MOTION%MD%BAROSTAT%VELOCITY")
CALL section_vals_set_subs_vals(input_file,"MOTION%MD%BAROSTAT%VELOCITY",&
- section,error=error)
- CALL set_restart_info("BAROSTAT",restarted_infos,error)
+ section)
+ CALL set_restart_info("BAROSTAT",restarted_infos)
END IF
- flag = check_restart(input_file, restart_file, "MOTION%MD", error)
+ flag = check_restart(input_file, restart_file, "MOTION%MD")
IF(flag) THEN
- CALL section_vals_val_get(input_file,"MOTION%MD%ENSEMBLE",i_val=ensemble,error=error)
+ CALL section_vals_val_get(input_file,"MOTION%MD%ENSEMBLE",i_val=ensemble)
IF(ensemble == npt_i_ensemble .OR. ensemble==npt_f_ensemble) THEN
- CALL section_vals_val_get(r_section,"RESTART_BAROSTAT_THERMOSTAT",l_val=flag,error=error)
- check = check_restart(input_file, restart_file, "MOTION%MD%BAROSTAT", error)
+ CALL section_vals_val_get(r_section,"RESTART_BAROSTAT_THERMOSTAT",l_val=flag)
+ check = check_restart(input_file, restart_file, "MOTION%MD%BAROSTAT")
CALL restart_thermostat(flag, input_file, restart_file, "MOTION%MD%BAROSTAT%THERMOSTAT", &
- check=check, error=error)
- IF (flag.AND.check) CALL set_restart_info("THERMOSTAT OF BAROSTAT",restarted_infos,error)
+ check=check)
+ IF (flag.AND.check) CALL set_restart_info("THERMOSTAT OF BAROSTAT",restarted_infos)
END IF
END IF
- check = check_restart(input_file, restart_file, "MOTION%MD%SHELL", error)
+ check = check_restart(input_file, restart_file, "MOTION%MD%SHELL")
IF(check) THEN
- CALL section_vals_val_get(r_section,"RESTART_SHELL_THERMOSTAT",l_val=flag,error=error)
- CALL restart_thermostat(flag, input_file, restart_file, "MOTION%MD%SHELL%THERMOSTAT", error=error)
- CALL set_restart_info("SHELL THERMOSTAT",restarted_infos,error)
+ CALL section_vals_val_get(r_section,"RESTART_SHELL_THERMOSTAT",l_val=flag)
+ CALL restart_thermostat(flag, input_file, restart_file, "MOTION%MD%SHELL%THERMOSTAT")
+ CALL set_restart_info("SHELL THERMOSTAT",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_THERMOSTAT",l_val=flag,error=error)
- CALL restart_thermostat(flag,input_file, restart_file, "MOTION%MD%THERMOSTAT", error=error)
- IF (flag) CALL set_restart_info("PARTICLE THERMOSTAT",restarted_infos,error)
+ CALL section_vals_val_get(r_section,"RESTART_THERMOSTAT",l_val=flag)
+ CALL restart_thermostat(flag,input_file, restart_file, "MOTION%MD%THERMOSTAT")
+ IF (flag) CALL set_restart_info("PARTICLE THERMOSTAT",restarted_infos)
- CALL section_vals_val_get(r_section,"RESTART_CONSTRAINT",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%CONSTRAINT",error)) THEN
- section => section_vals_get_subs_vals(restart_file,"MOTION%CONSTRAINT",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%CONSTRAINT",section,error=error)
- CALL set_restart_info("CONSTRAINTS/RESTRAINTS",restarted_infos,error)
+ CALL section_vals_val_get(r_section,"RESTART_CONSTRAINT",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%CONSTRAINT")) THEN
+ section => section_vals_get_subs_vals(restart_file,"MOTION%CONSTRAINT")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%CONSTRAINT",section)
+ CALL set_restart_info("CONSTRAINTS/RESTRAINTS",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_METADYNAMICS",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_METADYNAMICS",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN")) THEN
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_POS",error=error)
+ "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_POS")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_POS",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_SCALE",error=error)
+ "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_SCALE")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_SCALE",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_HEIGHT",error=error)
+ "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_HEIGHT")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_HEIGHT",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_INVDT",error=error)
+ "MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_INVDT")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%SPAWNED_HILLS_INVDT",&
- section,error=error)
+ section)
! Extended Lagrangian
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS0",error=error)
+ "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS0")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS0",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_VVP",error=error)
+ "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_VVP")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_VVP",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS",error=error)
+ "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_SS",&
- section,error=error)
+ section)
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_FS",error=error)
+ "MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_FS")
CALL section_vals_set_subs_vals(input_file,"MOTION%FREE_ENERGY%METADYN%EXT_LAGRANGE_FS",&
- section,error=error)
- CALL set_restart_info("METADYNAMICS",restarted_infos,error)
+ section)
+ CALL set_restart_info("METADYNAMICS",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_WALKERS",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN%MULTIPLE_WALKERS",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_WALKERS",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%FREE_ENERGY%METADYN%MULTIPLE_WALKERS")) THEN
CALL section_vals_val_get(restart_file,"MOTION%FREE_ENERGY%METADYN%MULTIPLE_WALKERS%WALKERS_STATUS",&
- i_vals=rwalkers_status, error=error)
+ i_vals=rwalkers_status)
ALLOCATE(iwalkers_status(SIZE(rwalkers_status)),stat=stat)
- CPPrecondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(stat==0,cp_failure_level,routineP,failure)
iwalkers_status = rwalkers_status
CALL section_vals_val_set(input_file,"MOTION%FREE_ENERGY%METADYN%MULTIPLE_WALKERS%WALKERS_STATUS",&
- i_vals_ptr=iwalkers_status, error=error)
- CALL set_restart_info("WALKERS INFO",restarted_infos,error)
+ i_vals_ptr=iwalkers_status)
+ CALL set_restart_info("WALKERS INFO",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_DIMER",l_val=flag,error=error)
- IF (flag.AND.check_restart(input_file, restart_file, "MOTION%GEO_OPT%TRANSITION_STATE%DIMER",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_DIMER",l_val=flag)
+ IF (flag.AND.check_restart(input_file, restart_file, "MOTION%GEO_OPT%TRANSITION_STATE%DIMER")) THEN
section => section_vals_get_subs_vals(restart_file,&
- "MOTION%GEO_OPT%TRANSITION_STATE%DIMER%DIMER_VECTOR",error=error)
+ "MOTION%GEO_OPT%TRANSITION_STATE%DIMER%DIMER_VECTOR")
CALL section_vals_set_subs_vals(input_file,"MOTION%GEO_OPT%TRANSITION_STATE%DIMER%DIMER_VECTOR",&
- section,error=error)
- CALL set_restart_info("DIMER TRANSITION STATE SEARCH",restarted_infos,error)
+ section)
+ CALL set_restart_info("DIMER TRANSITION STATE SEARCH",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"CUSTOM_PATH",n_rep_val=n_rep_val,error=error)
+ CALL section_vals_val_get(r_section,"CUSTOM_PATH",n_rep_val=n_rep_val)
DO i_rep_val=1,n_rep_val
- CALL section_vals_val_get(r_section,"CUSTOM_PATH",i_rep_val=i_rep_val,c_val=path,error=error)
+ CALL section_vals_val_get(r_section,"CUSTOM_PATH",i_rep_val=i_rep_val,c_val=path)
IF (path/=" ") THEN
- section => section_vals_get_subs_vals(restart_file,path,error=error)
- CALL section_vals_set_subs_vals(input_file,path,section,error=error)
- CALL set_restart_info("USER RESTART: "//TRIM(path),restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,path)
+ CALL section_vals_set_subs_vals(input_file,path,section)
+ CALL set_restart_info("USER RESTART: "//TRIM(path),restarted_infos)
END IF
END DO
- CALL section_vals_val_get(r_section,"RESTART_RTP",l_val=flag,error=error)
-! IF(flag.AND.check_restart(input_file, restart_file, "FORCE_EVAL%DFT%REAL_TIME_PROPAGATION",error)) THEN
+ CALL section_vals_val_get(r_section,"RESTART_RTP",l_val=flag)
+! IF(flag.AND.check_restart(input_file, restart_file, "FORCE_EVAL%DFT%REAL_TIME_PROPAGATION")) THEN
IF(flag)THEN
section => section_vals_get_subs_vals(restart_file,&
- "FORCE_EVAL%DFT%REAL_TIME_PROPAGATION",error=error)
- CALL section_vals_val_get(section,"INITIAL_WFN",i_val=myi,error=error)
+ "FORCE_EVAL%DFT%REAL_TIME_PROPAGATION")
+ CALL section_vals_val_get(section,"INITIAL_WFN",i_val=myi)
CALL section_vals_val_set(input_file,"FORCE_EVAL%DFT%REAL_TIME_PROPAGATION%INITIAL_WFN",&
- i_val=myi,error=error)
- CALL set_restart_info("REAL TIME PROPAGATION",restarted_infos,error)
+ i_val=myi)
+ CALL set_restart_info("REAL TIME PROPAGATION",restarted_infos)
END IF
! PIMD
- CALL section_vals_val_get(r_section,"RESTART_PINT_POS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_PINT_POS",l_val=flag)
IF(flag) THEN
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%BEADS%COORD",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%BEADS%COORD",section,error=error)
- CALL set_restart_info("PINT BEAD POSITIONS",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%BEADS%COORD")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%BEADS%COORD",section)
+ CALL set_restart_info("PINT BEAD POSITIONS",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_PINT_VEL",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_PINT_VEL",l_val=flag)
IF(flag) THEN
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%BEADS%VELOCITY",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%BEADS%VELOCITY",section,error=error)
- CALL set_restart_info("PINT BEAD VELOCITIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%BEADS%VELOCITY")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%BEADS%VELOCITY",section)
+ CALL set_restart_info("PINT BEAD VELOCITIES",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_PINT_NOSE",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_PINT_NOSE",l_val=flag)
IF(flag) THEN
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%NOSE%COORD",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%NOSE%COORD",section,error=error)
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%NOSE%VELOCITY",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%NOSE%VELOCITY",section,error=error)
- CALL set_restart_info("PINT NOSE THERMOSTAT",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%NOSE%COORD")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%NOSE%COORD",section)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%NOSE%VELOCITY")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%NOSE%VELOCITY",section)
+ CALL set_restart_info("PINT NOSE THERMOSTAT",restarted_infos)
END IF
- CALL section_vals_val_get(r_section,"RESTART_PINT_GLE",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_PINT_GLE",l_val=flag)
IF(flag) THEN
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%GLE",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%GLE",section,error=error)
- CALL set_restart_info("PINT GLE THERMOSTAT",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%GLE")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%GLE",section)
+ CALL set_restart_info("PINT GLE THERMOSTAT",restarted_infos)
END IF
! PIMC
!
- CALL section_vals_val_get(r_section,"RESTART_HELIUM_POS",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_HELIUM_POS",l_val=flag)
IF(flag) THEN
CALL section_vals_val_get(input_file,"MOTION%PINT%HELIUM%NUM_ENV",&
- explicit=explicit1, error=error)
+ explicit=explicit1)
IF ( .NOT. explicit1 ) THEN
- CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
END IF
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%COORD",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%COORD",section,error=error)
- CALL set_restart_info("HELIUM BEAD POSITIONS",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%COORD")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%COORD",section)
+ CALL set_restart_info("HELIUM BEAD POSITIONS",restarted_infos)
END IF
!
- CALL section_vals_val_get(r_section,"RESTART_HELIUM_PERMUTATION",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_HELIUM_PERMUTATION",l_val=flag)
IF(flag) THEN
CALL section_vals_val_get(input_file,"MOTION%PINT%HELIUM%NUM_ENV",&
- explicit=explicit1, error=error)
+ explicit=explicit1)
IF ( .NOT. explicit1 ) THEN
- CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
END IF
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%PERM",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%PERM",section,error=error)
- CALL set_restart_info("HELIUM PERMUTATION STATE",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%PERM")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%PERM",section)
+ CALL set_restart_info("HELIUM PERMUTATION STATE",restarted_infos)
END IF
!
- CALL section_vals_val_get(r_section,"RESTART_HELIUM_FORCE",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_HELIUM_FORCE",l_val=flag)
IF(flag) THEN
CALL section_vals_val_get(input_file,"MOTION%PINT%HELIUM%NUM_ENV",&
- explicit=explicit1, error=error)
+ explicit=explicit1)
IF ( .NOT. explicit1 ) THEN
- CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
END IF
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%FORCE",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%FORCE",section,error=error)
- CALL set_restart_info("HELIUM FORCES ON SOLUTE",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%FORCE")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%FORCE",section)
+ CALL set_restart_info("HELIUM FORCES ON SOLUTE",restarted_infos)
END IF
!
- CALL section_vals_val_get(r_section,"RESTART_HELIUM_RNG",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_HELIUM_RNG",l_val=flag)
IF(flag) THEN
CALL section_vals_val_get(input_file,"MOTION%PINT%HELIUM%NUM_ENV",&
- explicit=explicit1, error=error)
+ explicit=explicit1)
IF ( .NOT. explicit1 ) THEN
- CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
END IF
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%RNG_STATE",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%RNG_STATE",section,error=error)
- CALL set_restart_info("HELIUM RNG STATE",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%RNG_STATE")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%RNG_STATE",section)
+ CALL set_restart_info("HELIUM RNG STATE",restarted_infos)
END IF
!
!
- CALL section_vals_val_get(r_section,"RESTART_HELIUM_DENSITIES",l_val=flag,error=error)
+ CALL section_vals_val_get(r_section,"RESTART_HELIUM_DENSITIES",l_val=flag)
IF(flag) THEN
CALL section_vals_val_get(input_file,"MOTION%PINT%HELIUM%NUM_ENV",&
- explicit=explicit1, error=error)
+ explicit=explicit1)
IF ( .NOT. explicit1 ) THEN
- CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
- CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi,error=error)
+ CALL section_vals_val_get(restart_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
+ CALL section_vals_val_set(input_file,"MOTION%PINT%HELIUM%NUM_ENV",i_val=myi)
END IF
- section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%RHO",error=error)
- CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%RHO",section,error=error)
- CALL set_restart_info("HELIUM DENSITIES",restarted_infos,error)
+ section => section_vals_get_subs_vals(restart_file,"MOTION%PINT%HELIUM%RHO")
+ CALL section_vals_set_subs_vals(input_file,"MOTION%PINT%HELIUM%RHO",section)
+ CALL set_restart_info("HELIUM DENSITIES",restarted_infos)
END IF
!
- CALL section_vals_val_set(r_section,"RESTART_FILE_NAME", c_val=" ",error=error)
- CALL section_vals_release(restart_file,error=error)
+ CALL section_vals_val_set(r_section,"RESTART_FILE_NAME", c_val=" ")
+ CALL section_vals_release(restart_file)
CALL release_restart_info(restarted_infos, r_file_path, binary_restart_file,&
- output_unit, error)
+ output_unit)
END IF
END IF
CALL timestop(handle)
@@ -796,15 +784,13 @@ END SUBROUTINE handle_ext_restart
!> \brief store information on the restarted quantities
!> \param label ...
!> \param restarted_infos ...
-!> \param error ...
!> \author Teodoro Laino [tlaino] 09.2008 - University of Zurich
! *****************************************************************************
- SUBROUTINE set_restart_info(label, restarted_infos, error)
+ SUBROUTINE set_restart_info(label, restarted_infos)
CHARACTER(LEN=*), INTENT(IN) :: label
CHARACTER(LEN=default_string_length), &
DIMENSION(:), POINTER :: restarted_infos
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'set_restart_info', &
routineP = moduleN//':'//routineN
@@ -827,17 +813,15 @@ END SUBROUTINE set_restart_info
!> \param r_file_path ...
!> \param binary_restart_file ...
!> \param output_unit ...
-!> \param error ...
!> \author Teodoro Laino [tlaino] 09.2008 - University of Zurich
! *****************************************************************************
SUBROUTINE release_restart_info(restarted_infos, r_file_path,&
- binary_restart_file, output_unit, error)
+ binary_restart_file, output_unit)
CHARACTER(LEN=default_string_length), &
DIMENSION(:), POINTER :: restarted_infos
CHARACTER(LEN=*), INTENT(IN) :: r_file_path, &
binary_restart_file
INTEGER, INTENT(IN) :: output_unit
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'release_restart_info', &
routineP = moduleN//':'//routineN
@@ -876,7 +860,7 @@ SUBROUTINE release_restart_info(restarted_infos, r_file_path,&
END IF
IF (ASSOCIATED(restarted_infos)) THEN
DEALLOCATE(restarted_infos,stat=stat)
- CPPrecondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(stat==0,cp_failure_level,routineP,failure)
END IF
END SUBROUTINE release_restart_info
@@ -888,16 +872,13 @@ END SUBROUTINE release_restart_info
!> \param restart_file ...
!> \param path ...
!> \param check ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] 10.2007- University of Zurich
! *****************************************************************************
- SUBROUTINE restart_thermostat(flag, input_file, restart_file, path, check, error)
+ SUBROUTINE restart_thermostat(flag, input_file, restart_file, path, check)
LOGICAL, INTENT(IN) :: flag
TYPE(section_vals_type), POINTER :: input_file, restart_file
CHARACTER(LEN=*), INTENT(IN) :: path
LOGICAL, INTENT(IN), OPTIONAL :: check
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'restart_thermostat', &
routineP = moduleN//':'//routineN
@@ -909,17 +890,17 @@ SUBROUTINE restart_thermostat(flag, input_file, restart_file, path, check, error
TYPE(section_vals_type), POINTER :: section
failure = .FALSE.
- check_loc = check_restart(input_file, restart_file, TRIM(path), error)
+ check_loc = check_restart(input_file, restart_file, TRIM(path))
skip_other_checks = PRESENT(check)
IF (skip_other_checks) check_loc = check
IF (flag.AND.check_loc) THEN
! Let's check if the thermostat type is different otherwise it does not make any
! sense to do any kind of restart
- CALL section_vals_val_get(input_file,TRIM(path)//"%TYPE",i_val=input_type,error=error)
- CALL section_vals_val_get(restart_file,TRIM(path)//"%TYPE",i_val=restart_type,error=error)
+ CALL section_vals_val_get(input_file,TRIM(path)//"%TYPE",i_val=input_type)
+ CALL section_vals_val_get(restart_file,TRIM(path)//"%TYPE",i_val=restart_type)
IF (input_type==do_thermo_same_as_part) THEN
- CALL section_vals_val_get(input_file,"MOTION%MD%THERMOSTAT%TYPE",i_val=input_type,error=error)
+ CALL section_vals_val_get(input_file,"MOTION%MD%THERMOSTAT%TYPE",i_val=input_type)
END IF
IF (skip_other_checks) THEN
@@ -927,41 +908,41 @@ SUBROUTINE restart_thermostat(flag, input_file, restart_file, path, check, error
restart_region = do_region_global
ELSE
! Also the regions must be the same..
- CALL section_vals_val_get(input_file,TRIM(path)//"%REGION",i_val=input_region,error=error)
- CALL section_vals_val_get(restart_file,TRIM(path)//"%REGION",i_val=restart_region,error=error)
+ CALL section_vals_val_get(input_file,TRIM(path)//"%REGION",i_val=input_region)
+ CALL section_vals_val_get(restart_file,TRIM(path)//"%REGION",i_val=restart_region)
END IF
IF ((input_type==restart_type).AND.(input_region==restart_region)) THEN
SELECT CASE(input_type)
CASE(do_thermo_nose)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%COORD",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%COORD",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%COORD")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%COORD",section)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%VELOCITY",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%VELOCITY",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%VELOCITY")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%VELOCITY",section)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%MASS",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%MASS",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%MASS")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%MASS",section)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%FORCE",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%FORCE",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%NOSE%FORCE")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%NOSE%FORCE",section)
CASE(do_thermo_csvr)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%CSVR%THERMOSTAT_ENERGY",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%CSVR%THERMOSTAT_ENERGY",section,error=error)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%CSVR%RNG_INIT",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%CSVR%RNG_INIT",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%CSVR%THERMOSTAT_ENERGY")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%CSVR%THERMOSTAT_ENERGY",section)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%CSVR%RNG_INIT")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%CSVR%RNG_INIT",section)
CASE(do_thermo_gle)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%THERMOSTAT_ENERGY",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%THERMOSTAT_ENERGY",section,error=error)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%RNG_INIT",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%RNG_INIT",section,error=error)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%S",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%S",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%THERMOSTAT_ENERGY")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%THERMOSTAT_ENERGY",section)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%RNG_INIT")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%RNG_INIT",section)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%GLE%S")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%GLE%S",section)
CASE(do_thermo_al)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%AD_LANGEVIN%CHI",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%AD_LANGEVIN%CHI",section,error=error)
- section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%AD_LANGEVIN%MASS",error=error)
- CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%AD_LANGEVIN%MASS",section,error=error)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%AD_LANGEVIN%CHI")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%AD_LANGEVIN%CHI",section)
+ section => section_vals_get_subs_vals(restart_file,TRIM(path)//"%AD_LANGEVIN%MASS")
+ CALL section_vals_set_subs_vals(input_file,TRIM(path)//"%AD_LANGEVIN%MASS",section)
END SELECT
ELSE
CALL cp_assert((input_type==restart_type),cp_warning_level,cp_assertion_failed,routineP,&
@@ -987,15 +968,12 @@ END SUBROUTINE restart_thermostat
!> \param input_file the input file to initialize
!> \param restart_file ...
!> \param tag_section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval do_restart ...
!> \author teo
! *****************************************************************************
- FUNCTION check_restart(input_file, restart_file, tag_section, error) RESULT(do_restart)
+ FUNCTION check_restart(input_file, restart_file, tag_section) RESULT(do_restart)
TYPE(section_vals_type), POINTER :: input_file, restart_file
CHARACTER(LEN=*), INTENT(IN) :: tag_section
- TYPE(cp_error_type), INTENT(inout) :: error
LOGICAL :: do_restart
CHARACTER(len=*), PARAMETER :: routineN = 'check_restart', &
@@ -1008,10 +986,10 @@ FUNCTION check_restart(input_file, restart_file, tag_section, error) RESULT(do_r
CALL timeset(routineN,handle)
failure=.FALSE.
NULLIFY(work_section)
- work_section => section_vals_get_subs_vals(input_file,TRIM(tag_section),error=error)
- CALL section_vals_get(work_section,explicit=explicit1,error=error)
- work_section => section_vals_get_subs_vals(restart_file,TRIM(tag_section),error=error)
- CALL section_vals_get(work_section,explicit=explicit2,error=error)
+ work_section => section_vals_get_subs_vals(input_file,TRIM(tag_section))
+ CALL section_vals_get(work_section,explicit=explicit1)
+ work_section => section_vals_get_subs_vals(restart_file,TRIM(tag_section))
+ CALL section_vals_get(work_section,explicit=explicit2)
do_restart = explicit1.AND.explicit2
CALL timestop(handle)
@@ -1021,13 +999,10 @@ END FUNCTION check_restart
!> \brief Removes section used to restart a calculation from an
!> input file in memory
!> \param input_file the input file to initialize
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE remove_restart_info(input_file,error)
+ SUBROUTINE remove_restart_info(input_file)
TYPE(section_vals_type), POINTER :: input_file
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'remove_restart_info', &
routineP = moduleN//':'//routineN
@@ -1043,100 +1018,97 @@ SUBROUTINE remove_restart_info(input_file,error)
failure=.FALSE.
NULLIFY(work_section)
- section_to_delete => section_vals_get_subs_vals(input_file,"EXT_RESTART",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- sections1 => section_vals_get_subs_vals(input_file,"FORCE_EVAL",error=error)
- CALL section_vals_get(sections1, n_repetition=nforce_eval1, error=error)
+ section_to_delete => section_vals_get_subs_vals(input_file,"EXT_RESTART")
+ CALL section_vals_remove_values(section_to_delete)
+ sections1 => section_vals_get_subs_vals(input_file,"FORCE_EVAL")
+ CALL section_vals_get(sections1, n_repetition=nforce_eval1)
DO iforce_eval = 1, nforce_eval1
- section1 => section_vals_get_subs_vals3(sections1,"SUBSYS",i_rep_section=iforce_eval,error=error)
- section_to_delete => section_vals_get_subs_vals(section1,"COORD",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(section1,"VELOCITY",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
+ section1 => section_vals_get_subs_vals3(sections1,"SUBSYS",i_rep_section=iforce_eval)
+ section_to_delete => section_vals_get_subs_vals(section1,"COORD")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(section1,"VELOCITY")
+ CALL section_vals_remove_values(section_to_delete)
END DO
- motion_section => section_vals_get_subs_vals(input_file,"MOTION",error=error)
- md_section => section_vals_get_subs_vals(motion_section,"MD",error=error)
- CALL section_vals_get(md_section,explicit=explicit1,error=error)
+ motion_section => section_vals_get_subs_vals(input_file,"MOTION")
+ md_section => section_vals_get_subs_vals(motion_section,"MD")
+ CALL section_vals_get(md_section,explicit=explicit1)
IF (explicit1) THEN
- CALL section_vals_val_unset(md_section,"STEP_START_VAL",error=error)
- CALL section_vals_val_unset(md_section,"TIME_START_VAL",error=error)
- CALL section_vals_val_unset(md_section,"ECONS_START_VAL",error=error)
+ CALL section_vals_val_unset(md_section,"STEP_START_VAL")
+ CALL section_vals_val_unset(md_section,"TIME_START_VAL")
+ CALL section_vals_val_unset(md_section,"ECONS_START_VAL")
END IF
- work_section => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN",error=error)
- CALL section_vals_get(work_section,explicit=explicit1,error=error)
+ work_section => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN")
+ CALL section_vals_get(work_section,explicit=explicit1)
IF (explicit1) THEN
- CALL section_vals_val_unset(motion_section,"FREE_ENERGY%METADYN%STEP_START_VAL",error=error)
- CALL section_vals_val_unset(motion_section,"FREE_ENERGY%METADYN%NHILLS_START_VAL",error=error)
+ CALL section_vals_val_unset(motion_section,"FREE_ENERGY%METADYN%STEP_START_VAL")
+ CALL section_vals_val_unset(motion_section,"FREE_ENERGY%METADYN%NHILLS_START_VAL")
END IF
- section_to_delete => section_vals_get_subs_vals(motion_section,"BAND%REPLICA",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"AVERAGES%RESTART_AVERAGES",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%COORD",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%VELOCITY",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%MASS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%FORCE",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%MASS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%VELOCITY",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%COORD",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%VELOCITY",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%MASS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%FORCE",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%COORD",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%VELOCITY",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%MASS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%FORCE",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"BAND%REPLICA")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"AVERAGES%RESTART_AVERAGES")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%COORD")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%VELOCITY")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%MASS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"THERMOSTAT%NOSE%FORCE")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%MASS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%VELOCITY")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%COORD")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%VELOCITY")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%MASS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"BAROSTAT%THERMOSTAT%NOSE%FORCE")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%COORD")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%VELOCITY")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%MASS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(md_section,"SHELL%THERMOSTAT%NOSE%FORCE")
+ CALL section_vals_remove_values(section_to_delete)
! Constrained/Restrained section
- section_to_delete => section_vals_get_subs_vals(motion_section,"CONSTRAINT%FIX_ATOM_RESTART",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"CONSTRAINT%COLVAR_RESTART",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"CONSTRAINT%FIX_ATOM_RESTART")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"CONSTRAINT%COLVAR_RESTART")
+ CALL section_vals_remove_values(section_to_delete)
! Free energies restarts
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_POS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_SCALE",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_HEIGHT",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_INVDT",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_SS0",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_VVP",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_SS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
- section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_FS",error=error)
- CALL section_vals_remove_values(section_to_delete,error)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_POS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_SCALE")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_HEIGHT")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%SPAWNED_HILLS_INVDT")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_SS0")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_VVP")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_SS")
+ CALL section_vals_remove_values(section_to_delete)
+ section_to_delete => section_vals_get_subs_vals(motion_section,"FREE_ENERGY%METADYN%EXT_LAGRANGE_FS")
+ CALL section_vals_remove_values(section_to_delete)
CALL timestop(handle)
END SUBROUTINE remove_restart_info
! *****************************************************************************
!> \brief This subroutine controls the defaults for the restartable quantities..
!> \param r_section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo - University of Zurich - 09.2007 [tlaino]
! *****************************************************************************
- SUBROUTINE handle_defaults_restart(r_section,error)
+ SUBROUTINE handle_defaults_restart(r_section)
TYPE(section_vals_type), POINTER :: r_section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'handle_defaults_restart', &
routineP = moduleN//':'//routineN
@@ -1149,17 +1121,17 @@ SUBROUTINE handle_defaults_restart(r_section,error)
CALL timeset(routineN,handle)
failure=.FALSE.
NULLIFY(keyword, section)
- CALL section_vals_get(r_section, section=section, error=error)
- CALL section_vals_val_get(r_section,"RESTART_DEFAULT",l_val=restart_default,error=error)
+ CALL section_vals_get(r_section, section=section)
+ CALL section_vals_val_get(r_section,"RESTART_DEFAULT",l_val=restart_default)
DO ik=-1,section%n_keywords
keyword => section%keywords(ik)%keyword
IF (ASSOCIATED(keyword)) THEN
IF (keyword%type_of_var==logical_t.AND.keyword%names(1)(1:8)=="RESTART_") THEN
IF (TRIM(keyword%names(1))=="RESTART_DEFAULT") CYCLE
- CALL section_vals_val_get(r_section,keyword%names(1),n_rep_val=nval,error=error)
+ CALL section_vals_val_get(r_section,keyword%names(1),n_rep_val=nval)
IF (nval==0) THEN
! User didn't specify any value, use the value of the RESTART_DEFAULT keyword..
- CALL section_vals_val_set(r_section,keyword%names(1),l_val=restart_default,error=error)
+ CALL section_vals_val_set(r_section,keyword%names(1),l_val=restart_default)
END IF
END IF
END IF
diff --git a/src/input_cp2k_colvar.F b/src/input_cp2k_colvar.F
index d417cb8cea..8dca7b2da4 100644
--- a/src/input_cp2k_colvar.F
+++ b/src/input_cp2k_colvar.F
@@ -55,14 +55,11 @@ MODULE input_cp2k_colvar
!> \brief creates the colvar section
!> \param section the section to be created
!> \param skip_recursive_colvar ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- RECURSIVE SUBROUTINE create_colvar_section(section,skip_recursive_colvar,error)
+ RECURSIVE SUBROUTINE create_colvar_section(section,skip_recursive_colvar)
TYPE(section_type), POINTER :: section
LOGICAL, OPTIONAL :: skip_recursive_colvar
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_section', &
routineP = moduleN//':'//routineN
@@ -73,33 +70,30 @@ RECURSIVE SUBROUTINE create_colvar_section(section,skip_recursive_colvar,error)
failure=.FALSE.
skip=.FALSE.
IF(PRESENT(skip_recursive_colvar))skip=skip_recursive_colvar
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="COLVAR",&
description="This section specifies the nature of the collective variables.",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(subsection, print_key)
CALL create_colvar_var_section(subsection=subsection,&
- section=section,skip_recursive_colvar=skip,error=error)
+ section=section,skip_recursive_colvar=skip)
CALL section_create(subsection,name="PRINT",&
description="Controls the printing of the colvar specifications",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of basic information during colvar setup.", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_clv_info_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_clv_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_section
@@ -108,13 +102,10 @@ END SUBROUTINE create_colvar_section
!> This section will be only used for restraint restarts.
!> Constraints are handled automatically
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 08.2006
! *****************************************************************************
- SUBROUTINE create_clv_info_section(section, error)
+ SUBROUTINE create_clv_info_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_clv_info_section', &
routineP = moduleN//':'//routineN
@@ -123,21 +114,20 @@ SUBROUTINE create_clv_info_section(section, error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY( keyword)
CALL section_create(section,name="COLVAR_FUNC_INFO",&
description="Specify further data possibly used by colvars, depending "//&
"on the starting geometry, for computing the functions value.",&
- n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Colvar function data."//&
" The order is an internal order. So if you decide to edit/modify/add these values by hand"//&
" you should know very well what you are doing.!",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_clv_info_section
@@ -147,14 +137,11 @@ END SUBROUTINE create_clv_info_section
!> \param subsection ...
!> \param section the section to be created
!> \param skip_recursive_colvar ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- RECURSIVE SUBROUTINE create_colvar_var_section(subsection, section, skip_recursive_colvar, error)
+ RECURSIVE SUBROUTINE create_colvar_var_section(subsection, section, skip_recursive_colvar)
TYPE(section_type), POINTER :: subsection, section
LOGICAL, INTENT(IN) :: skip_recursive_colvar
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_var_section', &
routineP = moduleN//':'//routineN
@@ -162,101 +149,101 @@ RECURSIVE SUBROUTINE create_colvar_var_section(subsection, section, skip_recursi
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(subsection),cp_failure_level,routineP,error,failure)
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(subsection),cp_failure_level,routineP,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
- CALL create_colvar_dist_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_dist_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_angle_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_angle_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_torsion_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_torsion_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_coord_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_coord_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_pop_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_pop_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_gyr_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_gyr_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_d_pl_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_d_pl_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_a_pl_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_a_pl_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_rot_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_rot_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_dfunct_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_dfunct_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_qparm_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_qparm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_hydronium_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_hydronium_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_rmsd_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_rmsd_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_xyz_d_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_xyz_d_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_xyz_od_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_xyz_od_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_u_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_u_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_wc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_wc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_hbp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_hbp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_ring_puckering_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_ring_puckering_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_cond_dist_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_cond_dist_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
IF(.NOT. skip_recursive_colvar)THEN
- CALL create_colvar_rpath_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_rpath_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_dpath_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_dpath_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_colvar_comb_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_comb_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
ENDIF
END SUBROUTINE create_colvar_var_section
@@ -264,13 +251,10 @@ END SUBROUTINE create_colvar_var_section
! *****************************************************************************
!> \brief collective variables specifying coordination
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_coord_section(section,error)
+ SUBROUTINE create_colvar_coord_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_coord_section', &
routineP = moduleN//':'//routineN
@@ -281,11 +265,10 @@ SUBROUTINE create_colvar_coord_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="coordination",&
description="Section to define the coordination number as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection, keyword)
@@ -293,88 +276,88 @@ SUBROUTINE create_colvar_coord_section(section,error)
variants=(/"POINTS_FROM"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_FROM {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_TO",&
variants=(/"POINTS_TO"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_TO {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_TO_B",&
variants=(/"POINTS_TO_B"/),&
description="For the CV given by the multiplication of two coorination numbers,"//&
" here specify indexes of the third set of atoms/points. ",&
usage="ATOMS_TO_B {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_FROM",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_FROM {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_TO",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_TO {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_TO_B",&
description="For the CV given by the multiplication of two coorination numbers,"//&
" here specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_TO_B {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="R0",&
variants=(/"R_0"/),&
description="Specify the R0 parameter in the coordination function.",&
usage="R0 {real}",default_r_val=3.0_dp,&
- unit_str="bohr",n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="bohr",n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NN",&
variants=(/"EXPON_NUMERATOR"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="NN {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ND",&
variants=(/"EXPON_DENOMINATOR"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="ND {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R0_B",&
variants=(/"R_0_B"/),&
description="For the CV given by the multiplication of two coorination numbers,"//&
" specify the R0 parameter in the second coordination function.",&
usage="R0_B {real}",default_r_val=3.0_dp,&
- unit_str="bohr",n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="bohr",n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NN_B",&
variants=(/"EXPON_NUMERATOR_B"/),&
@@ -382,9 +365,9 @@ SUBROUTINE create_colvar_coord_section(section,error)
"Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="NN_B {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ND_B",&
variants=(/"EXPON_DENOMINATOR_B"/),&
@@ -392,9 +375,9 @@ SUBROUTINE create_colvar_coord_section(section,error)
"Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="ND_B {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_colvar_coord_section
@@ -404,11 +387,9 @@ END SUBROUTINE create_colvar_coord_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_colvar_cond_dist_section(section,error)
+ SUBROUTINE create_colvar_cond_dist_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_colvar_cond_dist_section', &
@@ -420,90 +401,89 @@ SUBROUTINE create_colvar_cond_dist_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="CONDITIONED_DISTANCE",&
description="Section to define the conditioned distance as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection, keyword)
CALL keyword_create(keyword, name="ATOMS_DISTANCE",&
description="Specify indexes of atoms/points from which the distance is computed. ",&
usage="ATOMS_DISTANCE {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_FROM",&
variants=(/"POINTS_FROM"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_FROM {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_TO",&
variants=(/"POINTS_TO"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_TO {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_FROM",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_FROM {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_TO",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_TO {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="R0",&
variants=(/"R_0"/),&
description="Specify the R0 parameter in the coordination function.",&
usage="R0 {real}",default_r_val=3.0_dp,&
- unit_str="bohr",n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="bohr",n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NN",&
variants=(/"EXPON_NUMERATOR"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="NN {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ND",&
variants=(/"EXPON_DENOMINATOR"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="ND {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
description="Specify the lambda parameter at the exponent of the conditioned distance function.",&
usage="R0 {real}",default_r_val=3.0_dp,&
- unit_str="bohr",n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="bohr",n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
@@ -515,14 +495,11 @@ END SUBROUTINE create_colvar_cond_dist_section
! *****************************************************************************
!> \brief collective variables specifying population of a specie based on coordination
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \date 01.2009
!> \author Fabio Sterpone
! *****************************************************************************
- SUBROUTINE create_colvar_pop_section(section,error)
+ SUBROUTINE create_colvar_pop_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_pop_section', &
routineP = moduleN//':'//routineN
@@ -533,11 +510,10 @@ SUBROUTINE create_colvar_pop_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="population",&
description="Section to define the population of specie as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection, keyword)
@@ -545,78 +521,78 @@ SUBROUTINE create_colvar_pop_section(section,error)
variants=(/"POINTS_FROM"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_FROM {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_TO",&
variants=(/"POINTS_TO"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_TO {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_FROM",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_FROM {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS_TO",&
description="Specify alternatively kinds of atoms building the coordination variable.",&
usage="KINDS_TO {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="R0",&
variants=(/"R_0"/),&
description="Specify the R0 parameter in the coordination function.",&
usage="R0 {real}",default_r_val=3.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NN",&
variants=(/"EXPON_NUMERATOR"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="NN {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ND",&
variants=(/"EXPON_DENOMINATOR"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="ND {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="n0",&
variants=(/"n_0"/),&
description="Specify the n0 parameter that sets the coordination of the species.",&
usage="n0 {integer}",default_i_val=4,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIGMA",&
description="Specify the gaussian width of used to build the population istogram.",&
usage="SIGMA {real}",default_r_val=0.5_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_colvar_pop_section
@@ -624,11 +600,9 @@ END SUBROUTINE create_colvar_pop_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_colvar_gyr_section(section,error)
+ SUBROUTINE create_colvar_gyr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_gyr_section', &
routineP = moduleN//':'//routineN
@@ -639,11 +613,10 @@ SUBROUTINE create_colvar_gyr_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="GYRATION_RADIUS",&
description="Section to define the gyration radius as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection, keyword)
@@ -651,21 +624,21 @@ SUBROUTINE create_colvar_gyr_section(section,error)
variants=(/"POINTS"/),&
description="Specify indexes of atoms/points defyining the gyration radius variable. ",&
usage="ATOMS {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINDS",&
description="Specify alternatively kinds of atoms defining the gyration radius.",&
usage="KINDS {CHAR} {CHAR} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_gyr_section
@@ -673,13 +646,10 @@ END SUBROUTINE create_colvar_gyr_section
! *****************************************************************************
!> \brief collective variables specifying torsion
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_dfunct_section(section,error)
+ SUBROUTINE create_colvar_dfunct_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_dfunct_section', &
routineP = moduleN//':'//routineN
@@ -690,12 +660,11 @@ SUBROUTINE create_colvar_dfunct_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DISTANCE_FUNCTION",&
description="Section to define functions between two distances as collective variables."//&
" The function is defined as d1+coeff*d2",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -703,30 +672,30 @@ SUBROUTINE create_colvar_dfunct_section(section,error)
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points for the two bonds d1=(1-2) d2=(3-4).",&
usage="ATOMS {integer} {integer} {integer} {integer}",&
- n_var=4, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COEFFICIENT",&
description="Specifies the coefficient in the function for the constraint."//&
" -1.0 has to be used for distance difference, 1.0 for distance addition",&
usage="COEFFICIENT {real}",&
- type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PBC",&
description="Whether periodic boundary conditions should be applied on the "//&
"atomic position before computing the colvar or not.",&
usage="PBC",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_dfunct_section
@@ -734,13 +703,10 @@ END SUBROUTINE create_colvar_dfunct_section
! *****************************************************************************
!> \brief collective variables specifying torsion
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_torsion_section(section,error)
+ SUBROUTINE create_colvar_torsion_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_colvar_torsion_section', &
@@ -752,11 +718,10 @@ SUBROUTINE create_colvar_torsion_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="torsion",&
description="Section to define the torsion as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -764,14 +729,14 @@ SUBROUTINE create_colvar_torsion_section(section,error)
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points defining the torsion.",&
usage="ATOMS {integer} {integer} {integer} {integer}",&
- n_var=4, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_torsion_section
@@ -779,13 +744,10 @@ END SUBROUTINE create_colvar_torsion_section
! *****************************************************************************
!> \brief collective variables specifying torsion
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_rot_section(section,error)
+ SUBROUTINE create_colvar_rot_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_rot_section', &
routineP = moduleN//':'//routineN
@@ -796,12 +758,11 @@ SUBROUTINE create_colvar_rot_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="bond_rotation",&
description="Section to define the rotation of a bond/line with respect to"//&
"another bond/line",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -809,38 +770,38 @@ SUBROUTINE create_colvar_rot_section(section,error)
description="Specifies the index of atom/point defining the first point"//&
"of the first bond/line.",&
usage="P1_BOND1 {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P2_BOND1",&
description="Specifies the index of atom/point defining the second point"//&
"of the first bond/line.",&
usage="P2_BOND1 {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P1_BOND2",&
description="Specifies the index of atom/point defining the first point"//&
"of the second bond/line.",&
usage="P1_BOND2 {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P2_BOND2",&
description="Specifies the index of atom/point defining the second point"//&
"of the second bond/line.",&
usage="P2_BOND2 {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_rot_section
@@ -848,13 +809,10 @@ END SUBROUTINE create_colvar_rot_section
! *****************************************************************************
!> \brief collective variables specifying angles
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_angle_section(section,error)
+ SUBROUTINE create_colvar_angle_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_angle_section', &
routineP = moduleN//':'//routineN
@@ -865,25 +823,24 @@ SUBROUTINE create_colvar_angle_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="angle",&
description="Section to define the angle as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="ATOMS",&
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points defining the angle.",&
usage="ATOMS {integer} {integer} {integer}",&
- n_var=3, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_angle_section
@@ -891,13 +848,10 @@ END SUBROUTINE create_colvar_angle_section
! *****************************************************************************
!> \brief creates the colvar section regarded to the collective variables dist
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_dist_section(section,error)
+ SUBROUTINE create_colvar_dist_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_dist_section', &
routineP = moduleN//':'//routineN
@@ -908,33 +862,32 @@ SUBROUTINE create_colvar_dist_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="distance",&
description="Section to define the distance as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="ATOMS",&
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points defining the distance.",&
usage="ATOMS {integer} {integer}",&
- n_var=2, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="AXIS",&
description="Define the axes along which the colvar should be evaluated",&
usage="AXIS (XYZ | X | Y | Z | XY| XZ | YZ)",&
enum_c_vals=s2a( "XYZ","X", "Y", "Z", "XY", "XZ", "YZ"),&
enum_i_vals=(/ do_clv_xyz, do_clv_x, do_clv_y,do_clv_z, do_clv_xy, do_clv_xz, do_clv_yz/),&
- default_i_val=do_clv_xyz, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_clv_xyz)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_dist_section
@@ -942,13 +895,10 @@ END SUBROUTINE create_colvar_dist_section
! *****************************************************************************
!> \brief creates the colvar section regarded to the collective variables dist
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_xyz_d_section(section,error)
+ SUBROUTINE create_colvar_xyz_d_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_xyz_d_section', &
routineP = moduleN//':'//routineN
@@ -959,23 +909,22 @@ SUBROUTINE create_colvar_xyz_d_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="XYZ_DIAG",&
description="Section to define the distance of an atom from its starting "//&
"position ((X-X(0))^2+(Y-Y(0))^2+(Z-Z(0))^2) or part of its components as a collective variable."//&
"If absolute_position is specified, instead the CV is represented by the "//&
"instantaneous position of the atom (only available for X, Y or Z components).",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="ATOM",&
variants=(/"POINT"/),&
description="Specifies the index of the atom/point.",&
usage="ATOM {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COMPONENT",&
description="Define the component of the position vector which will be used "//&
@@ -983,29 +932,29 @@ SUBROUTINE create_colvar_xyz_d_section(section,error)
usage="AXIS (XYZ | X | Y | Z | XY| XZ | YZ)",&
enum_c_vals=s2a( "XYZ","X", "Y", "Z", "XY", "XZ", "YZ"),&
enum_i_vals=(/ do_clv_xyz, do_clv_x, do_clv_y,do_clv_z, do_clv_xy, do_clv_xz, do_clv_yz/),&
- default_i_val=do_clv_xyz, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_clv_xyz)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PBC",&
description="Whether periodic boundary conditions should be applied on the "//&
"atomic position before computing the colvar or not.",&
usage="PBC",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ABSOLUTE_POSITION",&
description="If enabled, the absolute position of the atoms will be used. ",&
usage="ABSOLUTE_POSITION",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_xyz_d_section
@@ -1013,13 +962,10 @@ END SUBROUTINE create_colvar_xyz_d_section
! *****************************************************************************
!> \brief creates the colvar section regarded to the collective variables dist
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_xyz_od_section(section,error)
+ SUBROUTINE create_colvar_xyz_od_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_xyz_od_section', &
routineP = moduleN//':'//routineN
@@ -1030,22 +976,21 @@ SUBROUTINE create_colvar_xyz_od_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="XYZ_OUTERDIAG",&
description="Section to define the cross term (XA-XA(0))*(XB-XB(0))+(XA-XA(0))*(YB-YB(0))"//&
" or part of its components as a collective variable. The final term is given by the product "//&
" of the components of A with the components of B.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="ATOMS",&
variants=(/"POINTS"/),&
description="Specifies the index of the atoms/points A and B.",&
usage="ATOMS {integer} {integer}",&
- n_var=2, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COMPONENT_A",&
description="Define the component of the position vector which will be used "//&
@@ -1053,9 +998,9 @@ SUBROUTINE create_colvar_xyz_od_section(section,error)
usage="AXIS (XYZ | X | Y | Z | XY| XZ | YZ)",&
enum_c_vals=s2a( "XYZ","X", "Y", "Z", "XY", "XZ", "YZ"),&
enum_i_vals=(/ do_clv_xyz, do_clv_x, do_clv_y,do_clv_z, do_clv_xy, do_clv_xz, do_clv_yz/),&
- default_i_val=do_clv_xyz, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_clv_xyz)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COMPONENT_B",&
description="Define the component of the position vector which will be used "//&
@@ -1063,22 +1008,22 @@ SUBROUTINE create_colvar_xyz_od_section(section,error)
usage="AXIS (XYZ | X | Y | Z | XY| XZ | YZ)",&
enum_c_vals=s2a( "XYZ","X", "Y", "Z", "XY", "XZ", "YZ"),&
enum_i_vals=(/ do_clv_xyz, do_clv_x, do_clv_y,do_clv_z, do_clv_xy, do_clv_xz, do_clv_yz/),&
- default_i_val=do_clv_xyz, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_clv_xyz)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PBC",&
description="Whether periodic boundary conditions should be applied on the "//&
"atomic position before computing the colvar or not.",&
usage="PBC",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_xyz_od_section
@@ -1086,13 +1031,10 @@ END SUBROUTINE create_colvar_xyz_od_section
! *****************************************************************************
!> \brief energy as collective variable
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Sebastiano Caravati
! *****************************************************************************
- SUBROUTINE create_colvar_u_section(section,error)
+ SUBROUTINE create_colvar_u_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_u_section', &
routineP = moduleN//':'//routineN
@@ -1103,72 +1045,70 @@ SUBROUTINE create_colvar_u_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="u",&
description="Section to define the energy as a generalized collective variable.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection, keyword)
CALL section_create(subsection,name="MIXED",&
description="This section allows to use any function of the energy subsystems "//&
" in a mixed_env calculation as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="ENERGY_FUNCTION",&
description="Specifies the functional form of the collective variable in mathematical notation.",&
usage="ENERGY_FUNCTION (E1+E2-LOG(E1/E2))", type_of_var=lchar_t,&
- n_var=1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VARIABLES",&
description="Defines the variables of the functional form. To allow an efficient"//&
" mapping the order of the energy variables will be considered identical to the"//&
" order of the force_eval in the force_eval_order list.",&
usage="VARIABLES x", type_of_var=char_t,&
- n_var=-1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNITS",&
description="Optionally, allows to define valid CP2K unit strings for each parameter value. "//&
"It is assumed that the corresponding parameter value is specified in this unit.",&
usage="UNITS angstrom eV*angstrom^-1 angstrom^1 K", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DX",&
description="Parameter used for computing the derivative with the Ridders' method.",&
- usage="DX ", default_r_val=0.1_dp, unit_str="bohr", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=0.1_dp, unit_str="bohr")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERROR_LIMIT",&
description="Checks that the error in computing the derivative is not larger than "//&
"the value set; in case error is larger a warning message is printed.",&
- usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_u_section
@@ -1176,13 +1116,10 @@ END SUBROUTINE create_colvar_u_section
!> \brief creates the colvar section regarded to the collective variables distance
!> of a point from a plane
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_d_pl_section(section,error)
+ SUBROUTINE create_colvar_d_pl_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_d_pl_section', &
routineP = moduleN//':'//routineN
@@ -1193,42 +1130,41 @@ SUBROUTINE create_colvar_d_pl_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="distance_point_plane",&
description="Section to define the distance of a point from a plane "//&
"as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="PBC",&
description="Whether periodic boundary conditions should be applied on the "//&
"atomic position before computing the colvar or not.",&
usage="PBC",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_PLANE",&
variants=(/"POINTS_PLANE"/),&
description="Specifies the indexes of atoms/points defining the plane.",&
usage="ATOMS_PLANE ",&
- n_var=3, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOM_POINT",&
variants=(/"POINT_POINT"/),&
description="Specifies the atom/point index defining the point.",&
usage="ATOM_POINT ",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_d_pl_section
@@ -1237,13 +1173,10 @@ END SUBROUTINE create_colvar_d_pl_section
!> \brief creates the colvar section regarded to the collective variables
!> angles betweem two planes
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_a_pl_section(section,error)
+ SUBROUTINE create_colvar_a_pl_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_a_pl_section', &
routineP = moduleN//':'//routineN
@@ -1254,19 +1187,17 @@ SUBROUTINE create_colvar_a_pl_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="angle_plane_plane",&
description="This section defines the angle between two planes "//&
"as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL section_create(subsection,name="PLANE",&
description="This section defines the plane. When using this colvar, "//&
"two plane section must be defined!",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="DEF_TYPE",&
description="Specify how the plane is defined: either by 3 atoms or by a fixed normal "//&
@@ -1276,44 +1207,41 @@ SUBROUTINE create_colvar_a_pl_section(section,error)
enum_c_vals=s2a("ATOMS", "VECTOR"),&
enum_desc=s2a("Plane defined by the position of 3 atoms",&
"Plane defined by a fixed normal vector"),&
- enum_i_vals=(/plane_def_atoms,plane_def_vec/),error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/plane_def_atoms,plane_def_vec/))
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the indexes of 3 atoms/points defining the plane.",&
usage="ATOMS ",&
- n_var=3, type_of_var=integer_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NORMAL_VECTOR",&
description="Alternatively to 3 atoms/points one can define one of the two, "//&
"planes by defining its NORMAL vector.",&
usage="NORMAL_VECTOR 0.0 1.0 0.0",&
- n_var=3, type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ n_var=3, type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_a_pl_section
! *****************************************************************************
!> \brief create a geometrical point as a function of several atom coordinates
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_point_section(section,error)
+ SUBROUTINE create_point_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_point_section', &
routineP = moduleN//':'//routineN
@@ -1323,12 +1251,11 @@ SUBROUTINE create_point_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="POINT",&
description="Enables the possibility to use geometrical centers instead of single atoms"//&
" to define colvars",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -1339,31 +1266,31 @@ SUBROUTINE create_point_section(section,error)
enum_desc=s2a("Conmputes the geometrical center of the listed atoms",&
"Defines a fixed point in space"),&
enum_i_vals=(/ do_clv_geo_center, do_clv_fix_point /),&
- default_i_val=do_clv_geo_center, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_clv_geo_center)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the indexes of atoms defining the geometrical center",&
usage="ATOMS {integer} {integer} {integer} {integer}",&
- n_var=-1, type_of_var=integer_t, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHTS",&
description="Specifies the weights for a weighted geometrical center. Default is 1/natoms for every atom",&
usage="WEIGHTS {real} {real} {real} {real}",&
- n_var=-1, type_of_var=real_t, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=real_t, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XYZ",&
description="Specifies the xyz of the fixed point (if the case)",&
usage="XYZ {real} {real} {real}",&
n_var=3, type_of_var=real_t, unit_str="bohr",&
- repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_point_section
@@ -1371,13 +1298,10 @@ END SUBROUTINE create_point_section
! *****************************************************************************
!> \brief collective variables specifying torsion
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_colvar_qparm_section(section,error)
+ SUBROUTINE create_colvar_qparm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_qparm_section', &
routineP = moduleN//':'//routineN
@@ -1388,11 +1312,10 @@ SUBROUTINE create_colvar_qparm_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="qparm",&
description="Section to define the Q parameter (crystalline order parameter) as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -1400,42 +1323,42 @@ SUBROUTINE create_colvar_qparm_section(section,error)
variants=(/"POINTS_FROM"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_FROM {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_TO",&
variants=(/"POINTS_TO"/),&
description="Specify indexes of atoms/points building the coordination variable. ",&
usage="ATOMS_TO {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Specifies the distance cutoff for neighbors.",&
usage="RCUT {real}",&
- n_var=1, unit_str="angstrom",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="L",&
description="Specifies the L spherical harmonics from Ylm.",&
usage="L {integer}",&
- n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA",&
description="Specifies the width of the Fermi-Dirac style smearing around RCUT.",&
- usage="ALPHA {real}",unit_str="angstrom^-1",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ALPHA {real}",unit_str="angstrom^-1",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_qparm_section
@@ -1443,14 +1366,10 @@ END SUBROUTINE create_colvar_qparm_section
! *****************************************************************************
!> \brief collective variables specifying hydronium solvation
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Marcel Baer
! *****************************************************************************
- SUBROUTINE create_colvar_hydronium_section(section,error)
+ SUBROUTINE create_colvar_hydronium_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout), &
- OPTIONAL :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_colvar_hydronium_section', &
@@ -1462,130 +1381,126 @@ SUBROUTINE create_colvar_hydronium_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="hydronium",&
description="Section to define the formation of a hydronium as a collective variable.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="OXYGENS",&
description="Specify indexes of atoms building the coordination variable. ",&
usage="OXYGENS {integer} {integer} ..", repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HYDROGENS",&
description="Specify indexes of atoms building the coordination variable. ",&
usage="HYDROGENS {integer} {integer} ..", repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROO",&
variants=(/"R_OO"/),&
description="Specify the ROO parameter in the coordination function.",&
usage="ROO {real}",default_r_val=3.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="pNO",&
variants=(/"EXPON_NUMERATORA"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="pNO {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="qNO",&
variants=(/"EXPON_DENOMINATORA"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="qNO {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROH",&
variants=(/"R_OH"/),&
description="Specify the ROH parameter in the coordination function.",&
usage="ROH {real}",default_r_val=3.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="pNH",&
variants=(/"EXPON_NUMERATORB"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="pNH {integer}",default_i_val=6,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="qNH",&
variants=(/"EXPON_DENOMINATORB"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="qNH {integer}",default_i_val=12,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NH",&
variants=(/"NHtest"/),&
description="Specify the NH parameter in the hydronium function.",&
usage="NH {real}",default_r_val=3.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="p",&
variants=(/"EXPON_NUMERATOR"/),&
description="Sets the value of the numerator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="p {integer}",default_i_val=8,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="q",&
variants=(/"EXPON_DENOMINATOR"/),&
description="Sets the value of the denominator of the exponential factor"//&
"in the coordination FUNCTION.",&
usage="q {integer}",default_i_val=16,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
variants=(/"LAMBDA"/),&
description="Specify the LAMBDA parameter in the hydronium function.",&
usage="LAMBDA {real}",default_r_val=10.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_hydronium_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_colvar_rmsd_section(section,error)
+ SUBROUTINE create_colvar_rmsd_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout), &
- OPTIONAL :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_rmsd_section', &
routineP = moduleN//':'//routineN
@@ -1596,14 +1511,13 @@ SUBROUTINE create_colvar_rmsd_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="rmsd",&
description="Section to define a CV as function of RMSD computed with respect to"//&
" given reference configurations. For 2 configurations the colvar is equal to:"//&
" ss = (RMSDA-RMSDB)/(RMSDA+RMSDB), while if only 1 configuration is given, then the"//&
" colvar is just the RMSD from that frame.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection, subsubsection)
CALL keyword_create(keyword, name="SUBSET_TYPE",&
@@ -1611,48 +1525,48 @@ SUBROUTINE create_colvar_rmsd_section(section,error)
usage="SUBSET_TYPE ALL",&
enum_c_vals=s2a( "ALL","LIST", "WEIGHT_LIST"),&
enum_i_vals=(/ rmsd_all, rmsd_list, rmsd_weightlist/),&
- default_i_val=rmsd_all, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=rmsd_all)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALIGN_FRAMES",&
description="Whether the reference frames should be aligned to minimize the RMSD",&
usage="ALIGN_FRAME",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specify indexes of atoms building the subset. ",&
usage="ATOMS {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHTS",&
description="Specify weights of atoms building the subset. ",&
usage="weightS {real} {real} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="FRAME",&
description="Specify coordinates of the frame (number of frames can be either 1 or 2)",&
- repeats=.TRUE., error=error)
+ repeats=.TRUE.)
CALL keyword_create(keyword, name="COORD_FILE_NAME",&
description="Name of the xyz file with coordinates (alternative to &COORD section)",&
usage="COORD_FILE_NAME ",&
- default_lc_val="",error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL create_coord_section_cv(subsubsection,"RMSD",error=error)
- CALL section_add_subsection(subsection,subsubsection,error=error)
- CALL section_release(subsubsection,error=error)
+ CALL create_coord_section_cv(subsubsection,"RMSD")
+ CALL section_add_subsection(subsection,subsubsection)
+ CALL section_release(subsubsection)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_rmsd_section
@@ -1661,13 +1575,10 @@ END SUBROUTINE create_colvar_rmsd_section
!> \brief collective variables specifying the space orthogonal to the reaction path
!> in the space spanned by the involved collective coordinates
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fschiff
! *****************************************************************************
- SUBROUTINE create_colvar_rpath_section(section,error)
+ SUBROUTINE create_colvar_rpath_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_rpath_section', &
routineP = moduleN//':'//routineN
@@ -1676,29 +1587,25 @@ SUBROUTINE create_colvar_rpath_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="REACTION_PATH",&
description="Section defining a one dimensional reaction path in an Q-dimensional space of colvars. "//&
"Constraining this colvar, allows to sample the space orthogonal to the reaction path, "//&
"both in the Q-dimensional colvar and 3N-Q remaining coordinates. "//&
"For the details of the function see cited literature.",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Branduardi2007/), &
- error=error)
+ citations=(/Branduardi2007/))
- CALL keywords_colvar_path(section,error)
+ CALL keywords_colvar_path(section)
END SUBROUTINE create_colvar_rpath_section
! *****************************************************************************
!> \brief Distance from reaction path
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author 01.2010
! *****************************************************************************
- SUBROUTINE create_colvar_dpath_section(section,error)
+ SUBROUTINE create_colvar_dpath_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_dpath_section', &
routineP = moduleN//':'//routineN
@@ -1706,7 +1613,7 @@ SUBROUTINE create_colvar_dpath_section(section,error)
LOGICAL :: failure
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DISTANCE_FROM_PATH",&
description="Section defining the distance from a one dimensional reaction "//&
"path in an Q-dimensional space of colvars. "//&
@@ -1714,23 +1621,19 @@ SUBROUTINE create_colvar_dpath_section(section,error)
"both in the Q-dimensional colvar and 3N-Q remaining coordinates. "//&
"For the details of the function see cited literature.",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Branduardi2007/), &
- error=error)
+ citations=(/Branduardi2007/))
- CALL keywords_colvar_path(section,error)
+ CALL keywords_colvar_path(section)
END SUBROUTINE create_colvar_dpath_section
! *****************************************************************************
!> \brief Section describinf keywords for both reaction path and distance from reaction path
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author 01.2010
! *****************************************************************************
- SUBROUTINE keywords_colvar_path(section,error)
+ SUBROUTINE keywords_colvar_path(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'keywords_colvar_path', &
routineP = moduleN//':'//routineN
@@ -1740,23 +1643,23 @@ SUBROUTINE keywords_colvar_path(section,error)
subsubsection
NULLIFY(keyword, subsection, subsubsection, print_key)
- CALL create_colvar_section(subsection,skip_recursive_colvar=.TRUE.,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_section(subsection,skip_recursive_colvar=.TRUE.)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="DISTANCES_RMSD",&
description=" ",&
usage="DISTANCES_RMSD T", &
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMSD",&
description=" ",&
usage="RMSD T", &
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SUBSET_TYPE",&
@@ -1764,58 +1667,58 @@ SUBROUTINE keywords_colvar_path(section,error)
usage="SUBSET_TYPE ALL",&
enum_c_vals=s2a( "ALL","LIST"),&
enum_i_vals=(/ rmsd_all, rmsd_list/),&
- default_i_val=rmsd_all, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=rmsd_all)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALIGN_FRAMES",&
description="Whether the reference frames should be aligned to minimize the RMSD",&
usage="ALIGN_FRAME",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specify indexes of atoms building the subset. ",&
usage="ATOMS {integer} {integer} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="FRAME",&
description="Specify coordinates of the frame",&
- repeats=.TRUE., error=error)
+ repeats=.TRUE.)
CALL keyword_create(keyword, name="COORD_FILE_NAME",&
description="Name of the xyz file with coordinates (alternative to &COORD section)",&
usage="COORD_FILE_NAME ",&
- default_lc_val="",error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL create_coord_section_cv(subsubsection,"RMSD",error=error)
- CALL section_add_subsection(subsection,subsubsection,error=error)
- CALL section_release(subsubsection,error=error)
+ CALL create_coord_section_cv(subsubsection,"RMSD")
+ CALL section_add_subsection(subsection,subsubsection)
+ CALL section_release(subsubsection)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="FUNCTION",&
description="Specifies the ith element of the vector valued function that defines the reaction path. "//&
"This keyword needs to repeat exactly Q times, and the order must match the order of the colvars. "//&
"The VARIABLE (e.g. T) which parametrises the curve can be used as the target of a constraint.",&
usage="FUNCTION (sin(T+2)+2*T)", type_of_var=lchar_t,&
- n_var=1, default_lc_val="0",repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_lc_val="0",repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VARIABLE",&
description="Specifies the name of the variable that parametrises the FUNCTION "//&
"defining the reaction path.",&
usage="VARIABLE T", type_of_var=char_t,&
- n_var=1, repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
description="Specifies the exponent of the Gaussian used in the integral representation of the colvar."//&
@@ -1823,63 +1726,57 @@ SUBROUTINE keywords_colvar_path(section,error)
"In the limit of large values, it is given by the plane orthogonal to the path."//&
"In practice, modest values are required for stable numerical integration.",&
usage="LAMBDA {real}",&
- type_of_var=real_t,default_r_val=5.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_val=5.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEP_SIZE",&
description="Step size in the numerical integration, "//&
"a few thousand points are common, and the proper number also depends on LAMBDA.",&
usage="STEP_SIZE {real}",&
- type_of_var=real_t,default_r_val=0.01_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_val=0.01_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="RANGE",&
description="The range of VARIABLE used for the parametrisation.",&
usage="RANGE ",&
- n_var=2,type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,name="MAP",&
description="Activating this print key will print once a file with the values of the FUNCTION on a grid "//&
"of COLVAR values in a specified range. "//&
"GRID_SPACING and RANGE for every COLVAR has to be specified again in the same order as they are in the input.", &
- print_level=high_print_level,filename="PATH",&
- error=error)
+ print_level=high_print_level,filename="PATH")
CALL keyword_create(keyword,name="RANGE",&
description="The range of of the grid of the COLVAR.",&
usage="RANGE ",&
- n_var=2,type_of_var=real_t,repeats=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,type_of_var=real_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GRID_SPACING",&
description="Distance between two gridpoints for the grid on the COLVAR",&
usage="STEP_SIZE {real}",repeats=.TRUE.,&
- type_of_var=real_t,default_r_val=0.01_dp, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_val=0.01_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE keywords_colvar_path
! *****************************************************************************
!> \brief Colvar allowing a combination of COLVARS
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - 12.2008
! *****************************************************************************
- SUBROUTINE create_colvar_comb_section(section,error)
+ SUBROUTINE create_colvar_comb_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_comb_section', &
routineP = moduleN//':'//routineN
@@ -1890,17 +1787,16 @@ SUBROUTINE create_colvar_comb_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="COMBINE_COLVAR",&
description="Allows the possibility to combine several COLVARs into one COLVAR "//&
"with a generic function.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
- CALL create_colvar_section(subsection,skip_recursive_colvar=.TRUE.,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_section(subsection,skip_recursive_colvar=.TRUE.)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="FUNCTION",&
description="Specifies the function used to combine different COLVARs into one.",&
@@ -1914,45 +1810,45 @@ SUBROUTINE create_colvar_comb_section(section,error)
!> \param error=error ...
! *****************************************************************************
usage="FUNCTION SQRT(CV1^2+CV2^2)", type_of_var=lchar_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VARIABLES",&
description="Specifies the name of the variable that parametrises the FUNCTION "//&
"defining how COLVARS should be combined. The matching follows the same order of the "//&
"COLVARS definition in the input file.",&
- usage="VARIABLE CV1 CV2 CV3", type_of_var=char_t,n_var=-1, repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="VARIABLE CV1 CV2 CV3", type_of_var=char_t,n_var=-1, repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DX",&
description="Parameter used for computing the derivative of the combination "//&
"of COLVARs with the Ridders' method.",&
- usage="DX ", default_r_val=0.1_dp, unit_str="bohr", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=0.1_dp, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERROR_LIMIT",&
description="Checks that the error in computing the derivative is not larger than "//&
"the value set; in case error is larger a warning message is printed.",&
- usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_colvar_comb_section
@@ -1960,14 +1856,11 @@ END SUBROUTINE create_colvar_comb_section
!> \brief Creates the coord section
!> \param section the section to create
!> \param name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_coord_section_cv(section,name,error)
+ SUBROUTINE create_coord_section_cv(section,name)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_coord_section_cv', &
routineP = moduleN//':'//routineN
@@ -1977,31 +1870,27 @@ SUBROUTINE create_coord_section_cv(section,name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="coord",&
description="The positions for "//TRIM(name)//" used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify positions of the system",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_coord_section_cv
! *****************************************************************************
!> \brief collective variables specifying h bonds
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author alin m elena
! *****************************************************************************
- SUBROUTINE create_colvar_wc_section(section,error)
+ SUBROUTINE create_colvar_wc_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_wc_section', &
routineP = moduleN//':'//routineN
@@ -2012,33 +1901,32 @@ SUBROUTINE create_colvar_wc_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="wc",&
description="Section to define the hbond wannier centre as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="RCUT",&
description="Parameter used for computing the cutoff radius for searching "//&
"the wannier centres around an atom",&
usage="RCUT ", default_r_val=0.529177208590000_dp, unit_str="angstrom",&
- type_of_var=real_t,repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points defining the bond (Od, H, Oa).",&
usage="ATOMS {integer} {integer} {integer}",&
- n_var=3, type_of_var=integer_t,repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_wc_section
@@ -2047,13 +1935,10 @@ END SUBROUTINE create_colvar_wc_section
! *****************************************************************************
!> \brief collective variables specifying h bonds= wire
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author alin m elena
! *****************************************************************************
- SUBROUTINE create_colvar_hbp_section(section,error)
+ SUBROUTINE create_colvar_hbp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_colvar_hbp_section', &
routineP = moduleN//':'//routineN
@@ -2064,47 +1949,46 @@ SUBROUTINE create_colvar_hbp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="hbp",&
description="Section to define the hbond wannier centre as a collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="RCUT",&
description="Parameter used for computing the cutoff radius for searching "//&
"the wannier centres around an atom",&
usage="RCUT ", default_r_val=0.529177208590000_dp, unit_str="angstrom",&
- type_of_var=real_t,repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHIFT",&
description="Parameter used for shifting each term in the sum ", &
usage="SHIFT ", default_r_val=0.5_dp,&
- type_of_var=real_t,repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NPOINTS",&
description="The number of points in the path",&
usage="NPOINTS {integer}",default_i_val=-1,&
- n_var=1,type_of_var=integer_t,repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=integer_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
variants=(/"POINTS"/),&
description="Specifies the indexes of atoms/points defining the bond (Od, H, Oa).",&
usage="ATOMS {integer} {integer} {integer}",&
- n_var=3, type_of_var=integer_t,repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_hbp_section
@@ -2113,14 +1997,10 @@ END SUBROUTINE create_colvar_hbp_section
!> \brief collective variables specifying ring puckering
!> \brief D. Cremer and J.A. Pople, JACS 97 1354 (1975)
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Marcel Baer
! *****************************************************************************
- SUBROUTINE create_colvar_ring_puckering_section(section,error)
+ SUBROUTINE create_colvar_ring_puckering_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout), &
- OPTIONAL :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_colvar_ring_puckering_section', &
@@ -2132,11 +2012,10 @@ SUBROUTINE create_colvar_ring_puckering_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RING_PUCKERING",&
description="Section to define general ring puckering collective variables.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -2145,9 +2024,9 @@ SUBROUTINE create_colvar_ring_puckering_section(section,error)
description="Specifies the indexes of atoms/points defining the ring."//&
"At least 4 Atoms are needed.",&
usage="ATOMS {integer} {integer} {integer} ..",&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COORDINATE",&
description="Indicate the coordinate to be used. Follow the Cremer-Pople definition for a N ring."//&
@@ -2155,14 +2034,14 @@ SUBROUTINE create_colvar_ring_puckering_section(section,error)
"2..[N/2] are puckering coordinates."//&
"-2..-[N/2-1] are puckering angles.",&
usage="COORDINATE {integer}",default_i_val=0,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Must be present in each colvar and handled properly
- CALL create_point_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_point_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_colvar_ring_puckering_section
diff --git a/src/input_cp2k_constraints.F b/src/input_cp2k_constraints.F
index 7ec1d150a1..622c0f5e46 100644
--- a/src/input_cp2k_constraints.F
+++ b/src/input_cp2k_constraints.F
@@ -53,13 +53,10 @@ MODULE input_cp2k_constraints
!> \brief Create the constraint section. This section is useful to impose
!> constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_constraint_section(section,error)
+ SUBROUTINE create_constraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_constraint_section', &
routineP = moduleN//':'//routineN
@@ -70,87 +67,86 @@ SUBROUTINE create_constraint_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="constraint",&
description="Section specifying information regarding how to impose constraints"// &
" on the system.",&
- n_keywords=0, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=2, repeats=.FALSE.)
NULLIFY(subsection, keyword, print_key)
CALL keyword_create(keyword, name="SHAKE_TOLERANCE",&
variants=s2a("SHAKE_TOL","SHAKE"),&
description="Set the tolerance for the shake/rattle constraint algorithm.",&
usage="SHAKE_TOLERANCE ",&
- default_r_val=1.0E-6_dp, unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-6_dp, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROLL_TOLERANCE",&
variants=s2a("ROLL_TOL","ROLL"),&
description="Set the tolerance for the roll constraint algorithm.",&
usage="ROLL_TOLERANCE ",&
- default_r_val=1.0E-10_dp,unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-10_dp,unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CONSTRAINT_INIT",&
description="Apply constraints to the initial position and velocities."//&
" Default is to apply constraints only after the first MD step.",&
usage="CONSTRAINT_INIT ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
-
- CALL create_hbonds_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_g3x3_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_g4x6_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_vsite_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_collective_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_fixed_atom_section(subsection, error=error)
- CALL restraint_info_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_f_a_rest_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_clv_rest_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+
+ CALL create_hbonds_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_g3x3_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_g4x6_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_vsite_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_collective_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_fixed_atom_section(subsection)
+ CALL restraint_info_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_f_a_rest_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
+
+ CALL create_clv_rest_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(print_key,"constraint_info",&
description="Prints information about iterative constraints solutions",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"lagrange_multipliers",&
description="Prints out the lagrange multipliers of the specified constraints during an MD.",&
- print_level=high_print_level, filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level, filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_constraint_section
@@ -160,13 +156,10 @@ END SUBROUTINE create_constraint_section
!> This section will be only used for restraint restarts.
!> Constraints are handled automatically
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 08.2006
! *****************************************************************************
- SUBROUTINE create_clv_rest_section(section, error)
+ SUBROUTINE create_clv_rest_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_clv_rest_section', &
routineP = moduleN//':'//routineN
@@ -175,20 +168,19 @@ SUBROUTINE create_clv_rest_section(section, error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY( keyword)
CALL section_create(section,name="COLVAR_RESTART",&
description="Specify restart position only for COLVAR restraints.",&
- n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The restarting values for COLVAR restraints."//&
" The order is an internal order. So if you decide to modify these values by hand"//&
" first think what you're doing!",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_clv_rest_section
@@ -198,13 +190,10 @@ END SUBROUTINE create_clv_rest_section
!> This section will be only used for restraint restarts.
!> Constraints are handled automatically
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 08.2006
! *****************************************************************************
- SUBROUTINE create_f_a_rest_section(section, error)
+ SUBROUTINE create_f_a_rest_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_f_a_rest_section', &
routineP = moduleN//':'//routineN
@@ -213,20 +202,19 @@ SUBROUTINE create_f_a_rest_section(section, error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY( keyword)
CALL section_create(section,name="FIX_ATOM_RESTART",&
description="Specify restart position only for FIXED_ATOMS restraints.",&
- n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The restarting position of fixed atoms for restraints."//&
" The order is an internal order. So if you decide to modify these values by hand"//&
" first think what you're doing!",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_f_a_rest_section
@@ -234,13 +222,10 @@ END SUBROUTINE create_f_a_rest_section
! *****************************************************************************
!> \brief Create the restraint info section in the constraint section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 08.2006
! *****************************************************************************
- SUBROUTINE restraint_info_section(section, error)
+ SUBROUTINE restraint_info_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'restraint_info_section', &
routineP = moduleN//':'//routineN
@@ -251,36 +236,32 @@ SUBROUTINE restraint_info_section(section, error)
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(subsection, keyword)
CALL section_create(subsection,name="RESTRAINT",&
description="Activate and specify information on restraint instead of constraint",&
- n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="K",&
description="Specifies the force constant for the harmonic restraint. The functional "//&
"form for the restraint is: K*(X-TARGET)^2.",&
usage="K {real}",&
- type_of_var=real_t, default_r_val=0.0_dp, unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, default_r_val=0.0_dp, unit_str="internal_cp2k")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE restraint_info_section
! *****************************************************************************
!> \brief Create the constraint section for collective constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele [01.2006]
! *****************************************************************************
- SUBROUTINE create_collective_section(section,error)
+ SUBROUTINE create_collective_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_collective_section', &
routineP = moduleN//':'//routineN
@@ -290,80 +271,79 @@ SUBROUTINE create_collective_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="COLLECTIVE",&
description="Used to constraint collective (general) degrees of freedom, "//&
"writing langrangian multipliers to file.",&
- n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="COLVAR",&
description="Specifies the index (in input file order) of the type of colvar to constrain.",&
usage="COLVAR {int}",&
- type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLECULE",&
description="Specifies the index of the molecule kind (in input file order)"//&
"on which the constraint will be applied."//&
" MOLECULE and MOLNAME keyword exclude themself mutually.",&
- usage="MOLECULE {integer}", n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOLECULE {integer}", n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecule on which the constraint will be applied.",&
- usage="MOLNAME {character}", n_var=1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOLNAME {character}", n_var=1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERMOLECULAR",&
description="Specify if the constraint/restraint is intermolecular.",&
usage="INTERMOLECULAR ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="Specifies the target value of the constrained collective"//&
" variable (units depend on the colvar).",&
usage="TARGET {real}",&
- type_of_var=real_t, unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET_GROWTH",&
description="Specifies the growth speed of the target value of the constrained collective"//&
" variable.",&
usage="TARGET_GROWTH {real}",&
- default_r_val=0.0_dp, unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET_LIMIT",&
description="Specifies the limit of the growth of the target value of the constrained collective"//&
" variable. By default no limit at the colvar growth is set.",&
usage="TARGET_LIMIT {real}",type_of_var=real_t,&
- unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not apply the constraint to the QM region within a QM/MM calculation",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not apply the constraint to the MM region within a QM/MM calculation",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_collective_section
@@ -371,13 +351,10 @@ END SUBROUTINE create_collective_section
! *****************************************************************************
!> \brief Create the constraint section that fixes atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_fixed_atom_section(section,error)
+ SUBROUTINE create_fixed_atom_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_fixed_atom_section', &
routineP = moduleN//':'//routineN
@@ -386,12 +363,12 @@ SUBROUTINE create_fixed_atom_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="fixed_atoms",&
description="This section is used to constraint the overall atomic position (X,Y,Z). In case "//&
"a restraint is specified the value of the TARGET is considered to be the value of the "//&
"coordinates at the beginning of the run or alternatively the corresponding value in the section: "//&
- "FIX_ATOM_RESTART.",n_keywords=3, n_subsections=0, repeats=.TRUE., error=error)
+ "FIX_ATOM_RESTART.",n_keywords=3, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
! Section Parameter
@@ -411,25 +388,25 @@ SUBROUTINE create_fixed_atom_section(section,error)
"Fix X-Z components",&
"Fix Y-Z components",&
"Fix the full components of the atomic position."),&
- repeats=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Integer
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of atoms to freeze.",&
usage="LIST {integer} {integer} .. {integer}", repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecule to fix",&
usage="MOLNAME WAT MEOH", repeats=.TRUE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_SUBSYS",&
variants=(/"PROTEIN"/),&
@@ -440,9 +417,9 @@ SUBROUTINE create_fixed_atom_section(section,error)
enum_desc=s2a("fix nothing",&
"only the MM atoms itself",&
"the full molecule/residue that contains a MM atom (i.e. some QM atoms might be fixed as well)"),&
- default_i_val=do_constr_none,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_constr_none,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QM_SUBSYS",&
description="In a QM/MM run all QM atoms are fixed according to the argument.",&
@@ -452,25 +429,25 @@ SUBROUTINE create_fixed_atom_section(section,error)
"only the QM atoms itself",&
"the full molecule/residue that contains a QM atom (i.e. some MM atoms might be fixed as well)"),&
enum_i_vals=(/do_constr_none,do_constr_atomic,do_constr_molec/),&
- default_i_val=do_constr_none,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_constr_none,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not apply the constraint to the QM region within a QM/MM calculation."//&
" This keyword is active only together with MOLNAME",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not apply the constraint to the MM region within a QM/MM calculation."//&
" This keyword is active only together with MOLNAME",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_fixed_atom_section
@@ -478,13 +455,10 @@ END SUBROUTINE create_fixed_atom_section
! *****************************************************************************
!> \brief Create the constraint section specialized on g3x3 constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_g3x3_section(section,error)
+ SUBROUTINE create_g3x3_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_g3x3_section', &
routineP = moduleN//':'//routineN
@@ -494,11 +468,10 @@ SUBROUTINE create_g3x3_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="g3x3",&
description="This section is used to set 3x3 (3 atoms and 3 distances) constraints.",&
- n_keywords=3, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -507,65 +480,62 @@ SUBROUTINE create_g3x3_section(section,error)
variants=(/"MOL"/),&
description="Specifies the molecule kind number on which constraint will be applied."//&
" MOLECULE and MOLNAME keyword exclude themself mutually.",&
- usage="MOL {integer}", n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOL {integer}", n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecule on which the constraint will be applied.",&
- usage="MOLNAME {character}", n_var=1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOLNAME {character}", n_var=1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERMOLECULAR",&
description="Specify if the constraint/restraint is intermolecular.",&
usage="INTERMOLECULAR ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Atoms' index on which apply the constraint", usage="ATOMS 1 3 6",&
- n_var=-1,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Real
CALL keyword_create(keyword, name="DISTANCES",&
description="The constrained distances' values.",&
usage="DISTANCES {real} {real} {real}", type_of_var=real_t,&
- unit_str="internal_cp2k",n_var=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="internal_cp2k",n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logical
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not apply the constraint to the QM region within a QM/MM calculation",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not apply the constraint to the MM region within a QM/MM calculation",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_g3x3_section
! *****************************************************************************
!> \brief Create the constraint section specialized on H BONDS constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_hbonds_section(section,error)
+ SUBROUTINE create_hbonds_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hbonds_section', &
routineP = moduleN//':'//routineN
@@ -575,11 +545,10 @@ SUBROUTINE create_hbonds_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="HBONDS",&
description="This section is used to set bonds constraints involving Hydrogen atoms",&
- n_keywords=3, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
! Character
@@ -587,48 +556,48 @@ SUBROUTINE create_hbonds_section(section,error)
description="Defines the atoms' type forming a bond with an hydrogen. If not specified "//&
" the default bond value of the first molecule is used as constraint target",&
usage="ATOMS ",&
- n_var=-1,type_of_var=char_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLECULE",&
description="Specifies the indexes of the molecule kind (in input file order)"//&
"on which the constraint will be applied."//&
" MOLECULE and MOLNAME keyword exclude themself mutually.",&
usage="MOLECULE {integer} .. {integer} ", n_var=-1,&
- type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the names of the molecule on which the constraint will be applied.",&
usage="MOLNAME {character} .. {character} ", n_var=-1,&
- type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not shake HBONDS in the QM region within a QM/MM calculation",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not shake HBONDS in the MM region within a QM/MM calculation",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Real
CALL keyword_create(keyword, name="TARGETS",&
description="The constrained distances' values for the types defines in ATOM_TYPE.",&
usage="TARGETS {real} {real} {real}", type_of_var=real_t, n_var=-1,&
- unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_hbonds_section
@@ -636,13 +605,10 @@ END SUBROUTINE create_hbonds_section
! *****************************************************************************
!> \brief Create the constraint section specialized on g4x6 constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_g4x6_section(section,error)
+ SUBROUTINE create_g4x6_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_g4x6_section', &
routineP = moduleN//':'//routineN
@@ -652,11 +618,10 @@ SUBROUTINE create_g4x6_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="g4x6",&
description="This section is used to set 4x6 (4 atoms and 6 distances) constraints.",&
- n_keywords=3, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -665,65 +630,62 @@ SUBROUTINE create_g4x6_section(section,error)
variants=(/"MOL"/),&
description="Specifies the molecule number on which constraint will be applied."//&
" MOLECULE and MOLNAME keyword exclude themself mutually.",&
- usage="MOL {integer}", n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOL {integer}", n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecule on which the constraint will be applied.",&
- usage="MOLNAME {character}", n_var=1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOLNAME {character}", n_var=1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERMOLECULAR",&
description="Specify if the constraint/restraint is intermolecular.",&
usage="INTERMOLECULAR ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Atoms' index on which apply the constraint", usage="ATOMS 1 3 6 4",&
- n_var=4,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Real
CALL keyword_create(keyword, name="DISTANCES",&
description="The constrained distances' values.",&
usage="DISTANCES {real} {real} {real} {real} {real} {real}",&
- type_of_var=real_t, n_var=6,unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=6,unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logical
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not apply the constraint to the QM region within a QM/MM calculation",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not apply the constraint to the MM region within a QM/MM calculation",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_g4x6_section
! *****************************************************************************
!> \brief Create the constraint section specialized on vsite constraints
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author marcel baer
! *****************************************************************************
- SUBROUTINE create_vsite_section(section,error)
+ SUBROUTINE create_vsite_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_vsite_section', &
routineP = moduleN//':'//routineN
@@ -733,11 +695,10 @@ SUBROUTINE create_vsite_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="virtual_site",&
description="This section is used to set a virtual interaction-site constraint.",&
- n_keywords=3, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -746,54 +707,54 @@ SUBROUTINE create_vsite_section(section,error)
variants=(/"MOL"/),&
description="Specifies the molecule number on which constraint will be applied."//&
" MOLECULE and MOLNAME keyword exclude themself mutually.",&
- usage="MOL {integer}", n_var=1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOL {integer}", n_var=1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecule on which the constraint will be applied.",&
- usage="MOLNAME {character}", n_var=1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MOLNAME {character}", n_var=1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERMOLECULAR",&
description="Specify if the constraint/restraint is intermolecular.",&
usage="INTERMOLECULAR ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Atoms' index on which apply the constraint (v i j k), first is virtual site",&
usage="ATOMS 1 2 3 4",&
- n_var=4,type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Real
CALL keyword_create(keyword, name="PARAMETERS",&
description="The constrained paramters' values to construct virtual site."//&
"r_v=a*r_ij+b*r_kj",&
usage="PARAMETERS {real} {real}",&
- type_of_var=real_t, n_var=2,unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=2,unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logical
CALL keyword_create(keyword, name="EXCLUDE_QM",&
description="Does not apply the constraint to the QM region within a QM/MM calculation",&
usage="EXCLUDE_QM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_MM",&
description="Does not apply the constraint to the MM region within a QM/MM calculation",&
usage="EXCLUDE_MM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_vsite_section
END MODULE input_cp2k_constraints
diff --git a/src/input_cp2k_dft.F b/src/input_cp2k_dft.F
index cb2c054261..25d2355782 100644
--- a/src/input_cp2k_dft.F
+++ b/src/input_cp2k_dft.F
@@ -148,13 +148,10 @@ MODULE input_cp2k_dft
! *****************************************************************************
!> \brief creates the dft section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_dft_section(section,error)
+ SUBROUTINE create_dft_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dft_section', &
routineP = moduleN//':'//routineN
@@ -165,37 +162,35 @@ SUBROUTINE create_dft_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="dft",&
description="parameter needed by dft programs",&
- n_keywords=3, n_subsections=4, repeats=.FALSE., &
- error=error)
+ n_keywords=3, n_subsections=4, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="BASIS_SET_FILE_NAME",&
description="Name of the basis set file, may include a path",&
usage="BASIS_SET_FILE_NAME ",&
type_of_var=lchar_t,repeats=.TRUE.,&
- default_lc_val="BASIS_SET",n_var=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="BASIS_SET",n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POTENTIAL_FILE_NAME",&
description="Name of the pseudo potential file, may include a path",&
usage="POTENTIAL_FILE_NAME ",&
- default_lc_val="POTENTIAL",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="POTENTIAL")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WFN_RESTART_FILE_NAME",&
variants=(/"RESTART_FILE_NAME"/),&
description="Name of the wavefunction restart file, may include a path."//&
" If no file is specified, the default is to open the file as generated by the wfn restart print key.",&
usage="WFN_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="UKS",&
@@ -206,20 +201,18 @@ SUBROUTINE create_dft_section(section,error)
"and beta orbitals, i.e. no spin restriction is applied",&
usage="LSD",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="ROKS",&
variants=(/"RESTRICTED_OPEN_KOHN_SHAM"/),&
description="Requests a restricted open Kohn-Sham calculation",&
usage="ROKS",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="MULTIPLICITY",&
variants=(/"MULTIP"/),&
@@ -229,25 +222,24 @@ SUBROUTINE create_dft_section(section,error)
"even number and 2 (doublet) for an odd number "//&
"of electrons.",&
usage="MULTIPLICITY 3",&
- default_i_val=0,& ! this default value is just a flag to get the above
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0) ! this default value is just a flag to get the above
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE",&
description="The total charge of the system",&
usage="CHARGE -1",&
- default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCITATIONS",&
description="If excitations should be calculated",&
usage="EXCITATIONS",&
enum_c_vals=s2a("NONE","TDLR","TDDFPT"),&
enum_i_vals=(/ no_excitations, tddfpt_excitations, &
tddfpt_excitations/),&
- default_i_val=no_excitations, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=no_excitations)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="PLUS_U_METHOD",&
@@ -263,10 +255,9 @@ SUBROUTINE create_dft_section(section,error)
"Method based on Mulliken gross orbital populations (GOP)"),&
n_var=1,&
default_i_val=plus_u_mulliken,&
- usage="METHOD Lowdin",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="METHOD Lowdin")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="RELAX_MULTIPLICITY",&
@@ -279,17 +270,16 @@ SUBROUTINE create_dft_section(section,error)
"Kohn-Sham (UKS) calculations.",&
usage="RELAX_MULTIPLICITY 0.00001",&
repeats=.FALSE.,&
- default_r_val=0.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SUBCELLS",&
description="Read the grid size for subcell generation in the construction of "//&
"neighbor lists.", usage="SUBCELLS 1.5",&
- n_var=1,default_r_val=2.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=2.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="SURFACE_DIPOLE_CORRECTION",&
@@ -302,10 +292,9 @@ SUBROUTINE create_dft_section(section,error)
usage="SURF_DIP",&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- citations=(/Bengtsson1999/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/Bengtsson1999/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="SURF_DIP_DIR",&
@@ -315,132 +304,128 @@ SUBROUTINE create_dft_section(section,error)
enum_desc=s2a("Along x", "Along y", "Along z"),&
n_var=1,&
default_i_val=3,&
- usage="SURF_DIP_DIR Z",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SURF_DIP_DIR Z")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_scf_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_scf_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ls_scf_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ls_scf_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_almo_scf_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_almo_scf_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_kg_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_kg_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_admm_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_admm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_qs_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qs_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_tddfpt_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_tddfpt_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_mgrid_section(subsection,error=error)
- CALL section_add_subsection(section, subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mgrid_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_xc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_xc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_relativistic_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_relativistic_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_sic_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_sic_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_low_spin_roks_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_low_spin_roks_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_efield_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_efield_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_per_efield_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_per_efield_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ext_pot_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ext_pot_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_transport_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_transport_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! ZMP sections to include the external density or v_xc potential
- CALL create_ext_den_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ext_den_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ext_vxc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ext_vxc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_poisson_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_poisson_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_kpoints_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_kpoints_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_implicit_solv_section(subsection, error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_implicit_solv_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_density_fitting_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_density_fitting_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_xas_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_xas_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_localize_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_localize_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_rtp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rtp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_print_dft_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_dft_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_sccs_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_sccs_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_dft_section
! *****************************************************************************
!> \brief Implicit Solvation Model
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_implicit_solv_section(section,error)
+ SUBROUTINE create_implicit_solv_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_implicit_solv_section', &
routineP = moduleN//':'//routineN
@@ -452,50 +437,45 @@ SUBROUTINE create_implicit_solv_section(section,error)
failure=.FALSE.
NULLIFY(keyword, subsection, print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SCRF",&
description="Adds an implicit solvation model to the DFT calculation."//&
" Know also as Self Consistent Reaction Field.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,name="EPS_OUT",&
description="Value of the dielectric constant outside the sphere",&
usage="EPS_OUT ",&
- default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="LMAX",&
description="Maximum value of L used in the multipole expansion",&
usage="LMAX ",&
- default_i_val=3,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_sphere_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_sphere_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_implicit_solv_section
! *****************************************************************************
!> \brief Create Sphere cavity
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_sphere_section(section,error)
+ SUBROUTINE create_sphere_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_sphere_section', &
routineP = moduleN//':'//routineN
@@ -507,36 +487,32 @@ SUBROUTINE create_sphere_section(section,error)
failure=.FALSE.
NULLIFY(keyword, subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SPHERE",&
description="Treats the implicit solvent environment like a sphere",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,name="RADIUS",&
description="Value of the spherical cavity in the dielectric medium",&
usage="RADIUS ",&
unit_str="angstrom",&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_center_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_center_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_sphere_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_center_section(section,error)
+ SUBROUTINE create_center_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_center_section', &
routineP = moduleN//':'//routineN
@@ -547,26 +523,25 @@ SUBROUTINE create_center_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="CENTER",&
description="Defines the center of the sphere.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,name="XYZ",&
description="Coordinates of the center of the sphere",&
usage="XYZ ",&
unit_str="angstrom",&
- type_of_var=real_t, n_var=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOM_LIST",&
description="Defines a list of atoms to define the center of the sphere",&
usage="ATOM_LIST .. ",&
- type_of_var=integer_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="WEIGHT_TYPE",&
description="Defines the weight used to define the center of the sphere"//&
@@ -574,30 +549,28 @@ SUBROUTINE create_center_section(section,error)
usage="WEIGHT (UNIT|MASS)",&
enum_c_vals=(/"UNIT","MASS"/),&
enum_i_vals=(/weight_type_unit,weight_type_mass/),&
- default_i_val=weight_type_unit,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=weight_type_unit)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="FIXED",&
description="Specify if the center of the sphere should be fixed or"//&
" allowed to move",&
usage="FIXED ",&
- default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_center_section
! *****************************************************************************
!> \brief parameters fo the localization of wavefunctions
!> \param section ...
-!> \param error ...
!> \par History
!> 03.2005 created [MI]
! *****************************************************************************
- SUBROUTINE create_localize_section(section, error)
+ SUBROUTINE create_localize_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_localize_section', &
routineP = moduleN//':'//routineN
@@ -609,80 +582,78 @@ SUBROUTINE create_localize_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword, print_key)
CALL section_create(section,name="LOCALIZE",&
description="Use one of the available methods to define the localization "//&
" and possibly to optimize it to a minimum or a maximum.",&
- n_keywords=8, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=8, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the MOS localization procedure",&
- usage="&LOCALIZE T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="&LOCALIZE T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of iterations used for localization methods",&
- usage="MAX_ITER 2000", default_i_val=10000, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 2000", default_i_val=10000)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_CRAZY_ANGLE",&
description="Largest allowed angle for the crazy rotations algorithm (smaller is slower but more stable).",&
- usage="MAX_CRAZY_ANGLE 0.1", unit_str="rad", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_CRAZY_ANGLE 0.1", unit_str="rad", default_r_val=0.2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CRAZY_SCALE",&
description="scale angles",&
- usage="CRAZY_SCALE 0.9", default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CRAZY_SCALE 0.9", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CRAZY_USE_DIAG",&
description="Use diagonalization (slow) or pade based calculation of matrix exponentials.",&
- usage="CRAZY_USE_DIAG ", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CRAZY_USE_DIAG ", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="USE_HISTORY",&
description="Generate an improved initial guess based on a history of results, which is useful during MD."//&
"Will only work if the number of states to be localized remains constant.",&
- usage="USE_HISTORY ", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="USE_HISTORY ", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_OCCUPATION",&
description="Tolerance in the occupation number to select only fully occupied orbitals for the rotation",&
- usage="EPS_OCCUPATION 1.E-5", default_r_val=1.0E-8_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_OCCUPATION 1.E-5", default_r_val=1.0E-8_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OUT_ITER_EACH",&
description="Every how many iterations of the localization algorithm"//&
"(Jacobi) the tolerance value is printed out",&
- usage="OUT_ITER_EACH 100", default_i_val=100, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="OUT_ITER_EACH 100", default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_LOCALIZATION",&
description="Tolerance used in the convergence criterium of the localization methods.",&
- usage="EPS_LOCALIZATION 1.0E-2", default_r_val=1.0E-4_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_LOCALIZATION 1.0E-2", default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="MIN_OR_MAX",&
description="Requires the maximization of the spread of the wfn",&
usage="MIN_OR_MAX (SPREADMIN|SPREADMAX)",&
enum_c_vals=(/"SPREADMIN","SPREADMAX"/),&
enum_i_vals=(/do_loc_min, do_loc_max/),&
- default_i_val=do_loc_min,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_loc_min)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="METHOD",&
description="Method of optimization if any",&
@@ -698,61 +669,59 @@ SUBROUTINE create_localize_section(section, error)
"A new fast method is applied, might be slightly less robust than jacobi, but usually much faster",&
"Steepest descent minimization of an approximate l1 norm",&
"Using a direct minimisation approach"),&
- default_i_val=do_loc_jacobi,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_loc_jacobi)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="JACOBI_FALLBACK",&
description="Use Jacobi method in case no convergence was achieved"//&
" by using the crazy rotations method.",&
usage="JACOBI_FALLBACK", default_l_val=.TRUE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART",&
description="Restart the localization from a set of orbitals"//&
" read from a localization restart file.",&
usage="RESTART", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LOCHOMO_RESTART_FILE_NAME",&
description="File name where to read the MOS from"//&
"which to restart the localization procedure for occupied states",&
usage="LOCHOMO_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LOCLUMO_RESTART_FILE_NAME",&
description="File name where to read the MOS from"//&
"which to restart the localization procedure for unoccupied states",&
usage="LOCLUMO_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="OPERATOR",&
description="Type of opertator which defines the spread functional",&
usage="OPERATOR (BERRY|BOYS|PIPEK)",&
enum_c_vals=s2a("BERRY","BOYS","PIPEK"),&
enum_i_vals=(/op_loc_berry, op_loc_boys, op_loc_pipek/),&
- default_i_val=op_loc_berry,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=op_loc_berry)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="LIST",&
description="Indexes of the occupied wfn to be localized"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="LIST_UNOCCUPIED",&
description="Indexes of the unoccupied states to be localized, "//&
@@ -761,18 +730,18 @@ SUBROUTINE create_localize_section(section, error)
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="STATES",&
description="Which states to localize, LUMO up to now only available in GPW",&
usage="STATES (HOMO|LUMO|ALL)",&
enum_c_vals=s2a("OCCUPIED","UNOCCUPIED","ALL"),&
enum_i_vals=(/do_loc_homo, do_loc_lumo,do_loc_both/),&
- default_i_val=do_loc_homo,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_loc_homo)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="ENERGY_RANGE",&
@@ -782,44 +751,42 @@ SUBROUTINE create_localize_section(section, error)
usage=" ENERGY_RANGE lower_bound {real}, higher_bound {real}", &
repeats=.FALSE.,&
n_var=2,default_r_vals=(/0._dp,0._dp/),unit_str='eV',&
- type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_section)
CALL section_create(print_section,name="PRINT",&
description="Collects all printing options related to the Wannier centers and "//&
"properties computed with Wannier centers.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(print_section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(print_section,print_key)
+ CALL section_release(print_key)
! Add printing of wannier infos
- CALL print_wanniers(print_section, error)
+ CALL print_wanniers(print_section)
NULLIFY(subsection)
! Total Dipoles with wannier
- CALL create_dipoles_section(subsection,"TOTAL_DIPOLE",debug_print_level+1,error)
- CALL section_add_subsection(print_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dipoles_section(subsection,"TOTAL_DIPOLE",debug_print_level+1)
+ CALL section_add_subsection(print_section, subsection)
+ CALL section_release(subsection)
! Molecular Dipoles with wannier
- CALL create_dipoles_section(subsection,"MOLECULAR_DIPOLES",debug_print_level+1,error)
- CALL section_add_subsection(print_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dipoles_section(subsection,"MOLECULAR_DIPOLES",debug_print_level+1)
+ CALL section_add_subsection(print_section, subsection)
+ CALL section_release(subsection)
! Molecular States with wannier
- CALL create_molecular_states_section(subsection,error)
- CALL section_add_subsection(print_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_molecular_states_section(subsection)
+ CALL section_add_subsection(print_section, subsection)
+ CALL section_release(subsection)
! Wannier States with wannier
- CALL create_wannier_states_section(subsection,error)
- CALL section_add_subsection(print_section, subsection, error=error)
- CALL section_release(subsection,error=error)
- CALL section_add_subsection(section,print_section,error=error)
- CALL section_release(print_section,error=error)
+ CALL create_wannier_states_section(subsection)
+ CALL section_add_subsection(print_section, subsection)
+ CALL section_release(subsection)
+ CALL section_add_subsection(section,print_section)
+ CALL section_release(print_section)
END SUBROUTINE create_localize_section
@@ -828,13 +795,10 @@ END SUBROUTINE create_localize_section
!> \brief Controls the printing of the basic info coming from the LOCALIZE
!> section
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE print_wanniers(section, error)
+ SUBROUTINE print_wanniers(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'print_wanniers', &
routineP = moduleN//':'//routineN
@@ -844,92 +808,85 @@ SUBROUTINE print_wanniers(section, error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(print_key, keyword)
CALL cp_print_key_section_create(print_key,"WANNIER_CUBES",&
description="Controls the printing of the wannier functions ", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LU_BOUNDS",&
variants=(/"CUBES_LU"/),&
description="The lower and upper index of the states to be printed as cube",&
usage="CUBES_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LIST",&
description="Indexes of the states to be printed as cube files"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="CUBES_LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"WANNIER_CENTERS",&
description="Controls the printing of the wannier functions", &
print_level=high_print_level,add_last=add_last_numeric,filename="",&
- unit_str="angstrom",error=error)
+ unit_str="angstrom")
CALL keyword_create(keyword, name="IONS+CENTERS",&
description="prints out the wannier centers together with the particles",&
usage="IONS+CENTERS", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL add_format_keyword(keyword, print_key, pos=.TRUE.,&
- description="Specifies the format of the output file when IONS+CENTERS is enabled.",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file when IONS+CENTERS is enabled.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"WANNIER_SPREADS",&
description="Controls the printing of the wannier functions", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"LOC_RESTART",&
description="Controls the printing of restart file for localized MOS", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE print_wanniers
! *****************************************************************************
!> \brief Create the print dft section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_print_dft_section(section,error)
+ SUBROUTINE create_print_dft_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_dft_section', &
routineP = moduleN//':'//routineN
@@ -941,58 +898,51 @@ SUBROUTINE create_print_dft_section(section,error)
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PRINT",&
description="Section of possible print options in DFT code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key, keyword, subsection)
CALL cp_print_key_section_create(print_key,"PROGRAM_BANNER",&
description="Controls the printing of the banner of the MM program",&
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"KINETIC_ENERGY",&
description="Controls the printing of the kinetic energy",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DERIVATIVES",&
description="Print all derivatives after the DFT calculation", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword=keyword,&
name="ndigits",&
description="Specify the number of digits used to print derivatives",&
- default_i_val=6,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=6)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key_section=print_key,&
name="neighbor_lists",&
description="Controls the printing of the neighbor lists",&
- print_level=debug_print_level, filename="", unit_str="angstrom",&
- error=error)
+ print_level=debug_print_level, filename="", unit_str="angstrom")
CALL keyword_create(keyword=keyword,&
name="sab_orb",&
description="Activates the printing of the orbital "//&
"orbital neighbor lists, "//&
"i.e. the overlap neighbor lists",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_aux_fit",&
@@ -1000,10 +950,9 @@ SUBROUTINE create_print_dft_section(section,error)
"orbital neighbor lists wavefunction fitting basis, "//&
"i.e. the overlap neighbor lists",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_aux_fit_vs_orb",&
@@ -1011,20 +960,18 @@ SUBROUTINE create_print_dft_section(section,error)
"orbital mixed neighbor lists of wavefunction fitting basis, "//&
"and the orbital basis, i.e. the overlap neighbor lists",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_scp",&
description="Activates the printing of the vdW SCP "//&
"neighbor lists ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_vdw",&
@@ -1032,30 +979,27 @@ SUBROUTINE create_print_dft_section(section,error)
"neighbor lists (from DFT, DFTB, SE), "//&
"i.e. the dispersion neighbor lists",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_cn",&
description="Activates the printing of the "//&
"neighbor lists used for coordination numbers in vdW DFT-D3",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sac_ae",&
description="Activates the printing of the orbital "//&
"nuclear attraction neighbor lists (erfc potential)",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sac_ppl",&
@@ -1063,10 +1007,9 @@ SUBROUTINE create_print_dft_section(section,error)
"GTH-PPL neighbor lists (local part of the "//&
"Goedecker-Teter-Hutter pseudo potentials)",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sap_ppnl",&
@@ -1074,216 +1017,206 @@ SUBROUTINE create_print_dft_section(section,error)
"GTH-PPNL neighbor lists (non-local part of the"//&
"Goedecker-Teter-Hutter pseudo potentials)",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sap_oce",&
description="Activates the printing of the orbital "//&
"PAW-projector neighbor lists (only GAPW)",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_se",&
description="Activates the printing of the two-center "//&
"neighbor lists for Coulomb type interactions in NDDO ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_lrc",&
description="Activates the printing of the long-range SE correction "//&
"neighbor lists (only when doing long-range SE with integral scheme KDSO and KDSO-d)",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_tbe",&
description="Activates the printing of the DFTB Ewald "//&
"neighbor lists ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sab_core",&
description="Activates the printing of core interaction "//&
"neighbor lists ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="soo_list",&
description="Activates the printing of RI orbital-orbital "//&
"neighbor lists ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="sip_list",&
description="Activates the printing of RI basis-projector interaction "//&
"neighbor lists ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SUBCELL",&
description="Activates the printing of the subcells used for the"//&
"generation of neighbor lists.", unit_str="angstrom",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"AO_MATRICES",&
description="Controls the printing of the ao (i.e. contracted gaussian) matrices (debug).", &
- print_level=debug_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=debug_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword=keyword, name="NDIGITS",&
description="Specify the number of digits used to print the AO matrices",&
- default_i_val=6, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=6)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORE_HAMILTONIAN",&
description="If the printkey is activated controls the printing of the hamiltonian matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DENSITY",&
description="If the printkey is activated controls the printing of the density (P) matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KINETIC_ENERGY",&
description="If the printkey is activated controls the printing of the kinetic energy matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KOHN_SHAM_MATRIX",&
description="If the printkey is activated controls the printing of the kohn-sham matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MATRIX_VXC",&
description="If the printkey is activated compute and print the matrix of the exchange and correlation potential."//&
"Only the GGA part for GPW is printed",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORTHO",&
description="If the printkey is activated controls the printing of the orthogonalization matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OVERLAP",&
description="If the printkey is activated controls the printing of the overlap matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FERMI_CONTACT",&
description="If the printkey is activated controls the printing of the Fermi contact matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PSO",&
description="If the printkey is activated controls the printing of the paramagnetic spin-orbit matrices",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EFG",&
description="If the printkey is activated controls the printing of the electric field gradient matrices",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POTENTIAL_ENERGY",&
description="If the printkey is activated controls the printing of the potential energy matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OCE_HARD",&
description="If the printkey is activated controls the printing of the OCE HARD matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OCE_SOFT",&
description="If the printkey is activated controls the printing of the OCE SOFT matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="W_MATRIX",&
description="If the printkey is activated controls the printing of the w matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="W_MATRIX_AUX_FIT",&
description="If the printkey is activated controls the printing of the w matrix",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DERIVATIVES",&
description="If the printkey is activated controls the printing "//&
"of derivatives (for the matrixes that support this)",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"MO",&
description="Controls the printing of the molecular orbitals."//&
"Note that this is only functional with diagonalization based methods, in particular not with OT (see MO_CUBES)", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="Cartesian",&
description="If the printkey is activated controls the printing of the mo in the cartesian basis",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EIGENVALUES",variants=s2a("EIGVALS"),&
description="If the printkey is activated controls the printing of the eigenvalues of the mos",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EIGENVECTORS",variants=s2a("EIGVECS"),&
description="If the printkey is activated controls the printing of the eigenvectors of the mos",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OCCUPATION_NUMBERS",variants=s2a("OCCNUMS"),&
description="If the printkey is activated controls the printing of the occupation numbers of the mos",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="NDIGITS",&
description="Specify the number of digits used to print the MO eigenvalues and occupation numbers",&
- default_i_val=6, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=6)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="MO_INDEX_RANGE",&
variants=s2a("MO_RANGE","RANGE"),&
@@ -1293,73 +1226,67 @@ SUBROUTINE create_print_dft_section(section,error)
n_var=2,&
type_of_var=integer_t,&
default_i_vals=(/0,0/),&
- usage="MO_INDEX_RANGE 10 15",&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ usage="MO_INDEX_RANGE 10 15")
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_mo_cubes_section(print_key,error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL create_mo_cubes_section(print_key)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_stm_section(print_key,error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL create_stm_section(print_key)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_wfn_mix_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_wfn_mix_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="GAPW",&
description="Controls the printing of some gapw related information (debug).",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"projectors",&
description="If the printkey is activated controls if information on"//&
" the projectors is printed.",&
- print_level=debug_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"rho0_information",&
description="If the printkey is activated controls if information on rho0 is printed.",&
- print_level=debug_print_level,filename="__STD_OUT__",unit_str="angstrom",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=debug_print_level,filename="__STD_OUT__",unit_str="angstrom")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(print_key,"dft_control_parameters",&
description="Controls the printing of dft control parameters.", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"KPOINTS",&
description="Controls the printing of kpoint information.", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,&
name="E_DENSITY_CUBE",&
description="Controls the printing of cube files with "//&
"the electronic density and, for LSD "//&
"calculations, the spin density",&
- print_level=high_print_level,filename="",error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="TOTAL_DENSITY",&
description="Print the total electronic density in the case "//&
@@ -1374,16 +1301,15 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XRD_INTERFACE",&
description="It activates the print out of exponents and coefficients for the "//&
@@ -1392,227 +1318,218 @@ SUBROUTINE create_print_dft_section(section,error)
" If GAPW the local densities are also given in terms of a Gaussian expansion,"//&
" by fitting the difference between local-fhard and local-soft density for each atom."//&
" In this case the keyword TOTAL_DENSITY is set to FALSE",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGAUSS",&
description="Number of Gaussian functions used in the expansion of atomic (core) density",&
- usage="NGAUSS 10",n_var=1,default_i_val=12, type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NGAUSS 10",n_var=1,default_i_val=12, type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"tot_density_cube",&
description="Controls printing of cube files with "//&
"the total density (electrons+atomic core). Note that "//&
"the value of the total density is positive where the "//&
"electron density dominates and negative where the core is.",&
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"v_hartree_cube",&
description="Controls the printing of a cube file with eletrostatic "//&
" potential generated by the total density (electrons+ions). It is "//&
" valid only for QS with GPW formalism."//&
" Note that by convention the potential has opposite sign than the expected physical one.", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"external_potential_cube",&
description="Controls the printing of a cube file with external "//&
" potential from the DFT%EXTERNAL_POTENTIAL section only.",&
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! dielectric constant function
CALL cp_print_key_section_create(print_key,"dielectric_cube",&
description="Controls the printing of a cube file with dielectric constant from "//&
"the implicit Poisson solver.", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! dirichlet type constraints
CALL cp_print_key_section_create(print_key,"dirichlet_bc_cube",&
description="Controls the printing of cube files with Dirichlet type (boundary) regions "//&
"defined in the implicit Poisson solver section. Note that the generated cube files are "//&
"meant to be used only for visualization purposes and the values have no physical meaning.", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="TILE_CUBES",&
description="Print tiles that tessellate the Dirichlet regions into cube files. If TRUE, "//&
"generates cube files as many as the total number of tiles.",&
usage="TILE_CUBES ",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! charge introduced by Lagrange multipliers
CALL cp_print_key_section_create(print_key,"dirichlet_cstr_charge_cube",&
description="Controls the printing of cube files with penalty charges induced to "//&
"Dirichlet regions by Lagrange multipliers (implicit Poisson solver).", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! ZMP adding the print section for the v_xc cube
CALL cp_print_key_section_create(print_key,"v_xc_cube",&
description="Controls the printing of a cube file with xc "//&
" potential generated by the ZMP method (for the moment). It is "//&
" valid only for QS with GPW formalism .", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"efield_cube",&
description="Controls the printing of cube files with electric "//&
" field generated by the total density (electrons+ions). It is "//&
" valid only for QS with GPW formalism .", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ELF_CUBE",&
description="Controls printing of cube files with "//&
"the electron localization function (ELF). Note that "//&
"the value of ELF is defined between 0 and 1: Pauli kinetic energy density normalized "//&
" by the kinetic energy density of a uniform el. gas of same density.",&
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="density_cutoff",&
description=" ",&
@@ -1620,114 +1537,111 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
type_of_var=real_t,&
- default_r_val=1.0e-10_dp, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0e-10_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PDOS",&
description="Print out the DOS projected per kind and per angular momentum ",&
- print_level=debug_print_level,common_iter_levels=1,filename="",&
- error=error)
+ print_level=debug_print_level,common_iter_levels=1,filename="")
CALL keyword_create(keyword, name="COMPONENTS",&
description="Print out pdos distinguishing all angular momentum components.",&
usage="COMPONENTS", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="Append the pdos obtained at different iterations to the pdos output file."//&
"By defaut the file is overwritten",&
usage="APPEND", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NLUMO",&
description="Number of virtual orbitals to be added to the MO set (-1=all)."//newline//&
"CAUTION: Setting this value to be higher than the number of states present may cause a Cholesky error.",&
- usage="NLUMO integer",default_i_val=0, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NLUMO integer",default_i_val=0)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OUT_EACH_MO",&
description="Output on the status of the calculation every OUT_EACH_MO states. If -1 no output",&
- usage="OUT_EACH_MO integer",default_i_val=-1, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="OUT_EACH_MO integer",default_i_val=-1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
!
CALL section_create(subsection,name="LDOS",&
description="Controls the printing of local PDOS, projected on subsets"//&
" of atoms given through lists",&
- n_keywords=4, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=4, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="COMPONENTS",&
description="Print out pdos distinguishing all angular momentum components.",&
usage="COMPONENTS", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of indexes of atoms where to project the DOS ",&
usage="LIST {integer} {integer} .. {integer} ",type_of_var=integer_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(print_key,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(print_key,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="R_LDOS",&
description="Controls the printing of local PDOS, projected on 3D volume in real space,"//&
" the volume is defined in terms of position with respect to atoms in the lists",&
- n_keywords=4, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=4, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of indexes of atoms used to define the real space volume ",&
usage="LIST {integer} {integer} .. {integer} ",type_of_var=integer_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XRANGE",&
description="range of positions in Cartesian direction x: all grid points within "//&
" this range from at least one atom of the list are considered",&
- usage="XRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="XRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="YRANGE",&
description="range of positions in Cartesian direction y: all grid points within "//&
" this range from at least one atom of the list are considered",&
- usage="YRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="YRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ZRANGE",&
description="range of positions in Cartesian direction z: all grid points within "//&
" this range from at least one atom of the list are considered",&
- usage="ZRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ZRANGE -10.0 10.0",unit_str="angstrom",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERANGE",&
description="only project states with the eigenvalues in the given interval. "//&
"Default is all states.",&
- usage="ERANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ERANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(print_key,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(print_key,subsection)
+ CALL section_release(subsection)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
!
!Printing of Moments
- CALL create_dipoles_section(print_key,"MOMENTS",high_print_level,error)
+ CALL create_dipoles_section(print_key,"MOMENTS",high_print_level)
CALL keyword_create(keyword=keyword,&
name="MAX_MOMENT",&
description="Maximum moment to be calculated. Values higher than 1 not implemented under periodic boundaries.",&
@@ -1735,10 +1649,9 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
type_of_var=integer_t,&
- default_i_val=1,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="MAGNETIC",&
description="Calculate also magnetic moments, only implemented without periodic boundaries",&
@@ -1746,18 +1659,17 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
! Mulliken population analysis
CALL cp_print_key_section_create(print_key,"MULLIKEN",&
description="Controls the printing of the Mulliken (spin) population analysis", &
print_level=medium_print_level,filename="__STD_OUT__",&
- common_iter_levels=1, error=error)
+ common_iter_levels=1)
CALL keyword_create(&
keyword=keyword,&
name="PRINT_GOP",&
@@ -1767,10 +1679,9 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
name="PRINT_ALL",&
@@ -1779,18 +1690,17 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! Lowdin population analysis (fairly expensive to compute, so only at high)
CALL cp_print_key_section_create(print_key,"LOWDIN",&
description="Controls the printing of the Lowdin (spin) population analysis", &
print_level=high_print_level,filename="__STD_OUT__",&
- common_iter_levels=1, error=error)
+ common_iter_levels=1)
CALL keyword_create(&
keyword=keyword,&
name="PRINT_GOP",&
@@ -1799,10 +1709,9 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
name="PRINT_ALL",&
@@ -1811,26 +1720,24 @@ SUBROUTINE create_print_dft_section(section,error)
repeats=.FALSE.,&
n_var=1,&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! Hirshfeld population analysis
CALL cp_print_key_section_create(print_key,"HIRSHFELD",&
description="Controls the printing of the Hirshfeld (spin) population analysis", &
print_level=medium_print_level,filename="__STD_OUT__",&
- common_iter_levels=1, error=error)
+ common_iter_levels=1)
CALL keyword_create(keyword=keyword,name="SELF_CONSISTENT",&
description="Calculate charges from the Hirscheld-I (self_consistent) method."//&
" This scales only the full shape function, not the added charge as in the original scheme.",&
usage="SELF_CONSISTENT yes",repeats=.FALSE.,n_var=1,&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="SHAPE_FUNCTION",&
description="Type of shape function used for Hirshfeld partitioning.",&
usage="SHAPE_FUNCTION {Gaussian,Density}",repeats=.FALSE.,n_var=1,&
@@ -1838,22 +1745,20 @@ SUBROUTINE create_print_dft_section(section,error)
enum_c_vals=s2a("GAUSSIAN","DENSITY"),&
enum_desc=s2a("Single Gaussian with Colvalent radius", &
"Atomic density expanded in multiple Gaussians"), &
- enum_i_vals=(/shape_function_gaussian,shape_function_density/),&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/shape_function_gaussian,shape_function_density/))
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="REFERENCE_CHARGE",&
description="Charge of atomic partitioning function for Hirshfeld method.",&
usage="REFERENCE_CHARGE {Atomic,Mulliken}",repeats=.FALSE.,n_var=1,&
default_i_val=ref_charge_atomic,&
enum_c_vals=s2a("ATOMIC","MULLIKEN"),&
enum_desc=s2a("Use atomic core charges","Calculate Mulliken charges"), &
- enum_i_vals=(/ref_charge_atomic,ref_charge_mulliken/),&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ enum_i_vals=(/ref_charge_atomic,ref_charge_mulliken/))
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
! Xray diffraction
CALL cp_print_key_section_create(&
@@ -1863,8 +1768,7 @@ SUBROUTINE create_print_dft_section(section,error)
"diffraction spectrum",&
print_level=debug_print_level,&
filename="",&
- citations=(/Krack2000,Krack2002/),&
- error=error)
+ citations=(/Krack2000,Krack2002/))
CALL keyword_create(&
keyword=keyword,&
name="Q_MAX",&
@@ -1875,21 +1779,19 @@ SUBROUTINE create_print_dft_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=20.0_dp,&
- unit_str="angstrom^-1",&
- error=error),&
- unit_str="angstrom^-1",&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ unit_str="angstrom^-1"),&
+ unit_str="angstrom^-1")
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key_section=print_key,&
name="ELECTRIC_FIELD_GRADIENT",&
description="Calculate and print the electric field gradients"//&
"at atomic positions",&
print_level=debug_print_level,&
- filename="__STD_OUT__",error=error)
+ filename="__STD_OUT__")
CALL keyword_create(keyword=keyword,&
name="INTERPOLATION",&
@@ -1897,9 +1799,9 @@ SUBROUTINE create_print_dft_section(section,error)
usage="INTERPOLATION {logical}",&
repeats=.FALSE.,&
n_var=1,&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="GSPACE_SMOOTHING",&
@@ -1907,9 +1809,9 @@ SUBROUTINE create_print_dft_section(section,error)
usage="GSPACE_SMOOTHING cutoff {real}, width {real}", &
repeats=.FALSE.,&
n_var=2,default_r_vals=(/-1._dp,-1._dp/),&
- type_of_var=real_t, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="DEBUG",&
@@ -1917,32 +1819,32 @@ SUBROUTINE create_print_dft_section(section,error)
usage="DEBUG {logical}",&
repeats=.FALSE.,&
n_var=1,&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL create_gspace_interp_section(subsection,error=error)
- CALL section_add_subsection(print_key, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gspace_interp_section(subsection)
+ CALL section_add_subsection(print_key, subsection)
+ CALL section_release(subsection)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key_section=print_key,&
name="BASIS_MOLOPT_QUANTITIES",&
description="Print the two quantities needed in the basis molopt generation:"//&
" total energy and condition number of the overlap matrix (S matrix)",&
print_level=debug_print_level,&
- filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key_section=print_key,&
name="HYPERFINE_COUPLING_TENSOR",&
description="Calculate and print the EPR hyperfine coupling tensor"//&
" at atomic positions",&
print_level=debug_print_level,&
- filename="__STD_OUT__",error=error)
+ filename="__STD_OUT__")
CALL keyword_create(keyword=keyword,&
name="INTERACTION_RADIUS",&
@@ -1950,20 +1852,20 @@ SUBROUTINE create_print_dft_section(section,error)
usage="INTERACTION_RADIUS radius {real}",&
repeats=.FALSE.,&
n_var=1,default_r_val=10._dp,&
- type_of_var=real_t, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key_section=print_key,&
name="OPTIMIZE_LRI_BASIS",&
description="Optimize the exponents of the LRI basis set",&
print_level=low_print_level,&
- filename="OPTIMIZED_LRI_BASIS",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="OPTIMIZED_LRI_BASIS")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(&
print_key_section=print_key,&
@@ -1973,10 +1875,9 @@ SUBROUTINE create_print_dft_section(section,error)
filename="__STD_OUT__",&
each_iter_names=s2a("QS_SCF"),&
each_iter_values=(/0/),&
- citations=(/Dudarev1997,Dudarev1998/),&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ citations=(/Dudarev1997,Dudarev1998/))
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(&
print_key_section=print_key,&
@@ -1986,8 +1887,7 @@ SUBROUTINE create_print_dft_section(section,error)
filename="__STD_OUT__",&
each_iter_names=s2a("QS_SCF"),&
each_iter_values=(/0/),&
- citations=(/Fattebert2002,Andreussi2012/),&
- error=error)
+ citations=(/Fattebert2002,Andreussi2012/))
NULLIFY (sub_print_key)
@@ -2000,8 +1900,7 @@ SUBROUTINE create_print_dft_section(section,error)
print_level=debug_print_level,&
filename="",&
each_iter_names=s2a("QS_SCF"),&
- each_iter_values=(/0/),&
- error=error)
+ each_iter_values=(/0/))
CALL keyword_create(keyword,name="STRIDE",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 "//&
@@ -2009,20 +1908,18 @@ SUBROUTINE create_print_dft_section(section,error)
n_var=-1,&
default_i_vals=(/2,2,2/),&
type_of_var=integer_t,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="APPEND",&
description="Append the cube files when they already exist",&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_key,sub_print_key,error=error)
- CALL section_release(sub_print_key,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_key,sub_print_key)
+ CALL section_release(sub_print_key)
CALL cp_print_key_section_create(&
print_key_section=sub_print_key,&
@@ -2035,8 +1932,7 @@ SUBROUTINE create_print_dft_section(section,error)
filename="",&
each_iter_names=s2a("QS_SCF"),&
each_iter_values=(/0/),&
- citations=(/Fattebert2002,Andreussi2012/),&
- error=error)
+ citations=(/Fattebert2002,Andreussi2012/))
CALL keyword_create(keyword,name="STRIDE",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 "//&
@@ -2044,20 +1940,18 @@ SUBROUTINE create_print_dft_section(section,error)
n_var=-1,&
default_i_vals=(/2,2,2/),&
type_of_var=integer_t,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="APPEND",&
description="Append the cube files when they already exist",&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_key,sub_print_key,error=error)
- CALL section_release(sub_print_key,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_key,sub_print_key)
+ CALL section_release(sub_print_key)
CALL cp_print_key_section_create(&
print_key_section=sub_print_key,&
@@ -2069,8 +1963,7 @@ SUBROUTINE create_print_dft_section(section,error)
filename="",&
each_iter_names=s2a("QS_SCF"),&
each_iter_values=(/0/),&
- citations=(/Fattebert2002,Andreussi2012/),&
- error=error)
+ citations=(/Fattebert2002,Andreussi2012/))
CALL keyword_create(keyword,name="STRIDE",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 "//&
@@ -2078,23 +1971,21 @@ SUBROUTINE create_print_dft_section(section,error)
n_var=-1,&
default_i_vals=(/2,2,2/),&
type_of_var=integer_t,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="APPEND",&
description="Append the cube files when they already exist",&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub_print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_key,sub_print_key,error=error)
- CALL section_release(sub_print_key,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(sub_print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_key,sub_print_key)
+ CALL section_release(sub_print_key)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_dft_section
@@ -2102,11 +1993,9 @@ END SUBROUTINE create_print_dft_section
! *****************************************************************************
!> \brief creates the input section for dealing with homo lumos, including dumping cubes
!> \param print_key ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_mo_cubes_section(print_key,error)
+ SUBROUTINE create_mo_cubes_section(print_key)
TYPE(section_type), POINTER :: print_key
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mo_cubes_section', &
routineP = moduleN//':'//routineN
@@ -2117,52 +2006,49 @@ SUBROUTINE create_mo_cubes_section(print_key,error)
CALL cp_print_key_section_create(print_key,"MO_CUBES",&
description="Controls the printing of cubes of the molecular orbitals.", &
- print_level=high_print_level,filename="",&
- error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="write_cube",&
description="If the MO cube file should be written. If false, the eigenvalues are still computed."//&
" Can also be useful in combination with STM calculations",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="nlumo",&
description="If the printkey is activated controls the number of lumos"//&
" that are printed and dumped as a cube (-1=all)",&
- default_i_val=0, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="nhomo",&
description="If the printkey is activated controls the number of homos that dumped as a cube (-1=all),"//&
" eigenvalues are always all dumped",&
- default_i_val=1, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mo_cubes_section
! *****************************************************************************
!> \brief ...
!> \param print_key ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_stm_section(print_key,error)
+ SUBROUTINE create_stm_section(print_key)
TYPE(section_type), POINTER :: print_key
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_stm_section', &
routineP = moduleN//':'//routineN
@@ -2173,23 +2059,22 @@ SUBROUTINE create_stm_section(print_key,error)
CALL cp_print_key_section_create(print_key,"STM",&
description="Controls the printing of cubes for the generation of STM images.", &
- print_level=debug_print_level,filename="",&
- error=error)
+ print_level=debug_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="nlumo",&
description="If the printkey is activated controls the number of additional lumos"//&
" that are computed to be able to reproduce STM images obtained"//&
" from positive bias (imaging unoccupied states)",&
- default_i_val=0, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BIAS",&
@@ -2199,9 +2084,9 @@ SUBROUTINE create_stm_section(print_key,error)
"While positive values sum states in the range [EF,EF+bias[."//&
"If postive biases are used, sufficiently many unoccupied stated"//&
" (see ADDED_MOS and NLUMO ) should be computed.",&
- n_var=-1,type_of_var=real_t, default_r_vals=(/0.0_dp/), unit_str='eV', error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=real_t, default_r_vals=(/0.0_dp/), unit_str='eV')
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TH_TORB",&
description="Tip orbital symmetry in Tersoff-Hamann approximation to compute STM images",&
@@ -2211,25 +2096,24 @@ SUBROUTINE create_stm_section(print_key,error)
enum_c_vals=s2a("S","PX","PY","PZ","DXY","DYZ","DZX","DX2","DY2","DZ2"),&
enum_i_vals=(/orb_s,orb_px,orb_py,orb_pz,orb_dxy,orb_dyz,orb_dzx,orb_dx2,orb_dy2,orb_dz2/),&
enum_desc=s2a("s orbital","px orbital","py orbital","pz orbital",&
- "dxy orbital","dyz orbital","dzx orbital","x^2 orbital","y^2 orbital","z^2 orbital"),&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "dxy orbital","dyz orbital","dzx orbital","x^2 orbital","y^2 orbital","z^2 orbital"))
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REF_ENERGY",&
description="By default the reference energy is the Fermi energy. In order to compare"//&
" with STS experiments, where specific energy ranges are addressed, here"//&
" one can set a different reference energy."//&
" The energy range is anyway controlled by the BIAS",&
- type_of_var=real_t,default_r_val=0.0_dp, unit_str='eV',error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_val=0.0_dp, unit_str='eV')
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
@@ -2238,12 +2122,10 @@ END SUBROUTINE create_stm_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_wfn_mix_section(section, error)
+ SUBROUTINE create_wfn_mix_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_wfn_mix_section', &
routineP = moduleN//':'//routineN
@@ -2256,107 +2138,104 @@ SUBROUTINE create_wfn_mix_section(section, error)
NULLIFY(subsection)
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="WFN_MIX",&
description="A section that allows manipulation of the MO coeffs,"//&
" e.g. for changing a ground state into an excited state."//&
"Starting from a copy of the original MOs, changes can be made"//&
"by adding linear combinations of HOMO/LUMO of the original MOs to the result MOs",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="OVERWRITE_MOS",&
description="If the keyword is active molecular orbitals in memory will be replaced by the mixed wfn."//&
" In combination with RTP or EMD no restart will be required to use the mixed wfn.",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="UPDATE",&
description="update a result MO with with a linear combination of of original MOs."//&
" This section can be repeated to build arbitrary linear combinations using repeatedly y=a*y+b*x.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="RESULT_MO_INDEX",&
description="Index of the MO (y) to be modified. Counting down in energy with HOMO=1",&
- usage="RESULT_MO_INDEX 1", type_of_var=integer_t,default_i_val=0, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESULT_MO_INDEX 1", type_of_var=integer_t,default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESULT_MARKED_STATE",&
description="Specifies the MO according to "//&
"the marks set in MOLECULAR_STATES. The value corresponds to the repetition "//&
" of MARK_STATES in MOLECULAR_STATES",&
- usage="ORIG_MARKED_STATE 1", type_of_var=integer_t,default_i_val=0, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORIG_MARKED_STATE 1", type_of_var=integer_t,default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESULT_SPIN_INDEX",&
description="Spin of the MO (y) to be modified.",&
enum_c_vals=s2a("Alpha","Beta"),&
enum_i_vals=(/ 1, 2/),& ! direct index in array
default_i_val=1,&
- enum_desc=s2a("Majority spin","Minority spin"), error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_desc=s2a("Majority spin","Minority spin"))
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESULT_SCALE",&
description="Scaling factor of the result variable (a).",&
- usage="RESULT_SCALE 0.0", type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESULT_SCALE 0.0", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORIG_MO_INDEX",&
description="Index of the original MO (x). "//&
"Counting down in energy with HOMO=1 or up from LUMO=1, depending on ORIG_IS_VIRTUAL.",&
- usage="ORIG_MO_INDEX 1", type_of_var=integer_t,default_i_val=0, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORIG_MO_INDEX 1", type_of_var=integer_t,default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORIG_MARKED_STATE",&
description="Specifies the MO according to "//&
"the marks set in MOLECULAR_STATES. The value corresponds to the repetition "//&
" of MARK_STATES in MOLECULAR_STATES",&
- usage="ORIG_MARKED_STATE 1", type_of_var=integer_t,default_i_val=0, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORIG_MARKED_STATE 1", type_of_var=integer_t,default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORIG_SPIN_INDEX",&
description="Spin of the MO (x) to be modified.",&
enum_c_vals=s2a("Alpha","Beta"),&
enum_i_vals=(/ 1, 2/),& ! direct index in array
default_i_val=1,&
- enum_desc=s2a("Majority spin","Minority spin"), error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_desc=s2a("Majority spin","Minority spin"))
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORIG_SCALE",&
description="Scaling factor of the result variable (b).",&
- usage="ORIG_SCALE 0.0", type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORIG_SCALE 0.0", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORIG_IS_VIRTUAL",&
description="The original MO (x) is a LUMO.",&
- usage="ORIG_IS_VIRTUAL", type_of_var=logical_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORIG_IS_VIRTUAL", type_of_var=logical_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_wfn_mix_section
! *****************************************************************************
!> \brief creates the input section for the molecular states
!> \param print_key ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_molecular_states_section(print_key,error)
+ SUBROUTINE create_molecular_states_section(print_key)
TYPE(section_type), POINTER :: print_key
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_molecular_states_section', &
@@ -2367,18 +2246,18 @@ SUBROUTINE create_molecular_states_section(print_key,error)
TYPE(section_type), POINTER :: print_key2
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,failure)
NULLIFY(print_key2, keyword)
CALL cp_print_key_section_create(print_key,"MOLECULAR_STATES",&
description="Controls printing of molecular states ",&
- print_level=high_print_level,filename=" ",citations=(/Hunt2003/), error=error)
+ print_level=high_print_level,filename=" ",citations=(/Hunt2003/))
CALL keyword_create(keyword, name="CUBE_EVAL_RANGE",&
description="only write cubes if the eigenvalues of the corresponding molecular states lie in the given interval. "//&
"Default is all states.",&
- usage="CUBE_EVAL_RANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CUBE_EVAL_RANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="MARK_STATES",&
description="Can be used to mark given molecular states."//&
@@ -2388,33 +2267,31 @@ SUBROUTINE create_molecular_states_section(print_key,error)
"This is only meaningful in combination with WFN_MIX. "//&
"First integer specifies the molecule, second integer specifies the state.",&
usage="MARK_STATES integer integer",&
- n_var=2,default_i_vals=(/-1,-1/), type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/-1,-1/), type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key2,"cubes",&
description="Controls the printing of cube files", &
- print_level=high_print_level,filename="",error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key2,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_key,print_key2,error=error)
- CALL section_release(print_key2,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key2,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_key,print_key2)
+ CALL section_release(print_key2)
END SUBROUTINE create_molecular_states_section
! *****************************************************************************
!> \brief ...
!> \param print_key ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_wannier_states_section(print_key,error)
+ SUBROUTINE create_wannier_states_section(print_key)
TYPE(section_type), POINTER :: print_key
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_wannier_states_section', &
@@ -2425,18 +2302,18 @@ SUBROUTINE create_wannier_states_section(print_key,error)
TYPE(section_type), POINTER :: print_key2
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,failure)
NULLIFY(print_key2, keyword)
CALL cp_print_key_section_create(print_key,"WANNIER_STATES",&
description="Controls printing of molecular states ",&
- print_level=high_print_level,filename=" ", error=error)
+ print_level=high_print_level,filename=" ")
CALL keyword_create(keyword, name="CUBE_EVAL_RANGE",&
description="only write cubes if the eigenvalues of the corresponding molecular states lie in the given interval. "//&
"Default is all states.",&
- usage="CUBE_EVAL_RANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CUBE_EVAL_RANGE -1.0 1.0",unit_str="hartree",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="MARK_STATES",&
description="Can be used to mark given molecular states."//&
@@ -2446,34 +2323,31 @@ SUBROUTINE create_wannier_states_section(print_key,error)
"This is only meaningful in combination with WFN_MIX. "//&
"First integer specifies the molecule, second integer specifies the state.",&
usage="MARK_STATES integer integer",&
- n_var=2,default_i_vals=(/-1,-1/), type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/-1,-1/), type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key2,"cubes",&
description="Controls the printing of cube files", &
- print_level=high_print_level,filename="",error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key2,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_key,print_key2,error=error)
- CALL section_release(print_key2,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key2,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_key,print_key2)
+ CALL section_release(print_key2)
END SUBROUTINE create_wannier_states_section
! *****************************************************************************
!> \brief creates the input section for the qs part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_qs_section(section,error)
+ SUBROUTINE create_qs_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qs_section', &
routineP = moduleN//':'//routineN
@@ -2483,141 +2357,124 @@ SUBROUTINE create_qs_section(section,error)
TYPE(section_type), POINTER :: subsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"qs",&
description="parameters needed to set up the Quickstep framework",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
! Reals
CALL keyword_create(keyword, name="EPS_DEFAULT",&
description="Try setting all EPS_xxx to values leading to an energy correct up to EPS_DEFAULT",&
- usage="EPS_DEFAULT real", default_r_val=1.0E-10_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DEFAULT real", default_r_val=1.0E-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CORE_CHARGE",&
description="Precision for mapping the core charges.Overrides EPS_DEFAULT/100.0 value",&
- usage="EPS_CORE_CHARGE real", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_CORE_CHARGE real", type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_GVG_RSPACE",&
variants=(/"EPS_GVG"/),&
description="Sets precision of the realspace KS matrix element integration. Overrides SQRT(EPS_DEFAULT) value",&
- usage="EPS_GVG_RSPACE real",type_of_var=real_t ,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_GVG_RSPACE real",type_of_var=real_t )
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_PGF_ORB",&
description="Sets precision of the overlap matrix elements. Overrides SQRT(EPS_DEFAULT) value",&
- usage="EPS_PGF_ORB real",type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_PGF_ORB real",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_KG_ORB",&
description="Sets precision used in coloring the subsets for the Kim-Gordon method. Overrides SQRT(EPS_DEFAULT) value",&
usage="EPS_KG_ORB 1.0E-8",&
- type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_PPL",&
description="Adjusts the precision for the local part of the pseudo potential. ",&
- usage="EPS_PPL real", type_of_var=real_t, default_r_val=1.0E-2_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_PPL real", type_of_var=real_t, default_r_val=1.0E-2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_PPNL",&
description="Sets precision of the non-local part of the pseudo potential. Overrides sqrt(EPS_DEFAULT) value",&
- usage="EPS_PPNL real", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_PPNL real", type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CPC",&
description="Sets precision of the GAPW projection. Overrides EPS_DEFAULT value",&
- usage="EPS_CPC real", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_CPC real", type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_RHO",&
description="Sets precision of the density mapping on the grids.Overrides EPS_DEFAULT value",&
- usage="EPS_RHO real",type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_RHO real",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_RHO_RSPACE",&
description="Sets precision of the density mapping in rspace.Overrides EPS_DEFAULT value."//&
".Overrides EPS_RHO value",&
- usage="EPS_RHO_RSPACE real",type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_RHO_RSPACE real",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_RHO_GSPACE",&
description="Sets precision of the density mapping in gspace.Overrides EPS_DEFAULT value."//&
".Overrides EPS_RHO value",&
- usage="EPS_RHO_GSPACE real",type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_RHO_GSPACE real",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_FILTER_MATRIX",&
description="Sets the threshold for filtering matrix elements.",&
- usage="EPS_FILTER_MATRIX 1.0E-6", type_of_var=real_t,default_r_val=0.0E0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_FILTER_MATRIX 1.0E-6", type_of_var=real_t,default_r_val=0.0E0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPSFIT",&
variants=(/"EPS_FIT"/),&
description="GAPW: precision to give the extention of a hard gaussian ",&
- usage="EPSFIT real", default_r_val=1.0E-4_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPSFIT real", default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPSISO",&
variants=(/"EPS_ISO"/),&
description="GAPW: precision to determine an isolated projector",&
- usage="EPSISO real", default_r_val=1.0E-12_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPSISO real", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPSSVD",&
variants=(/"EPS_SVD"/),&
description="GAPW: tolerance used in the singular value decomposition of the projector matrix",&
- usage="EPS_SVD real", default_r_val=1.0E-8_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SVD real", default_r_val=1.0E-8_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPSRHO0",&
variants=s2a("EPSVRHO0","EPS_VRHO0"),&
description="GAPW : precision to determine the range of V(rho0-rho0soft)",&
- usage="EPSRHO0 real", default_r_val=1.0E-6_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPSRHO0 real", default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA0_HARD",&
variants=s2a("ALPHA0_H","ALPHA0"),&
description="GAPW: Exponent for hard compensation charge",&
- usage="ALPHA0_HARD real", default_r_val=0.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ALPHA0_HARD real", default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FORCE_PAW",&
description="Use the GAPW scheme also for atoms with soft basis sets, i.e. "//&
@@ -2626,46 +2483,45 @@ SUBROUTINE create_qs_section(section,error)
"the corresponding density contribution goes on the global grid and is expanded in PW. "//&
" This option nullifies the effect of the GPW_TYPE in the atomic KIND",&
usage="FORCE_PAW",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_RAD_LOCAL",&
description="GAPW : maximum radius of gaussian functions"//&
" included in the generation of projectors",&
- usage="MAX_RAD_LOCAL real", default_r_val=25.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_RAD_LOCAL real", default_r_val=25.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logicals
CALL keyword_create(keyword, name="LS_SCF",&
description="Perform a linear scaling SCF",&
usage="LS_SCF",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALMO_SCF",&
description="Perform ALMO SCF",&
usage="ALMO_SCF",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRANSPORT",&
description="Perform transport calculations (coupling CP2K and OMEN)",&
usage="TRANSPORT",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KG_METHOD",&
description="Use a Kim-Gordon-like scheme.",&
usage="KG_METHOD",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,citations=(/Iannuzzi2006, Brelaz1979/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,citations=(/Iannuzzi2006, Brelaz1979/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAP_CONSISTENT",&
description="Compute the exact derivative (Hks) of the energy with respect to the density matrix. "//&
@@ -2673,34 +2529,34 @@ SUBROUTINE create_qs_section(section,error)
"but consistent mapping can improve the stability of the SCF procedure, "//&
"especially for a tight EPS_SCF and a less tight EPS_DEFAULT.",&
usage="MAP_CONSISTENT FALSE",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Integers
CALL keyword_create(keyword, name="LMAXN1",&
variants=(/"LMAXRHO1"/),&
description="GAPW : max L number for expansion of the atomic densities in spherical gaussians",&
usage="LMAXN1 integer",&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LMAXN0",&
variants=(/"LMAXRHO0"/),&
description="GAPW : max L number for the expansion compensation densities in spherical gaussians",&
usage="LMAXN0 integer",&
- default_i_val=2,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LADDN0",&
description="GAPW : integer added to the max L of the basis set, used to determine the "//&
"maximum value of L for the compensation charge density.",&
usage="LADDN0 integer",&
- default_i_val=99,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=99)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Characters
CALL keyword_create(keyword, name="QUADRATURE",&
@@ -2711,9 +2567,9 @@ SUBROUTINE create_qs_section(section,error)
enum_desc=s2a("Gauss-Chebyshev quadrature",&
"Transformed Gauss-Chebyshev quadrature",&
"Logarithmic transformed Gauss-Chebyshev quadrature"),&
- default_i_val=do_gapw_log, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_gapw_log)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PW_GRID",&
description="What kind of PW_GRID should be employed",&
@@ -2721,9 +2577,9 @@ SUBROUTINE create_qs_section(section,error)
enum_c_vals=s2a("SPHERICAL","NS-FULLSPACE","NS-HALFSPACE"),&
enum_desc=s2a("- not tested"," tested"," - not tested"),&
enum_i_vals=(/ do_pwgrid_spherical, do_pwgrid_ns_fullspace,do_pwgrid_ns_halfspace/),&
- default_i_val=do_pwgrid_ns_fullspace, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_pwgrid_ns_fullspace)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PW_GRID_LAYOUT",&
description="Force a particular real-space layout for the plane waves grids. "//&
@@ -2732,10 +2588,9 @@ SUBROUTINE create_qs_section(section,error)
"i.e. plane distributed for large grids, more general distribution for small grids.",&
usage="PW_GRID_LAYOUT 4 16",&
repeats=.FALSE.,n_var=2,&
- default_i_vals=(/-1,-1/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_vals=(/-1,-1/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PW_GRID_BLOCKED",&
description="Can be used to set the distribution in g-space for the pw grids and their FFT.",&
@@ -2743,9 +2598,9 @@ SUBROUTINE create_qs_section(section,error)
enum_c_vals=s2a("FREE","TRUE","FALSE"),&
enum_desc=s2a("CP2K will select an appropriate value","blocked","not blocked"),&
enum_i_vals=(/do_pw_grid_blocked_free,do_pw_grid_blocked_true,do_pw_grid_blocked_false/),&
- default_i_val=do_pw_grid_blocked_free, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_pw_grid_blocked_free)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTRAPOLATION",&
variants=s2a("INTERPOLATION","WF_INTERPOLATION"),&
@@ -2776,9 +2631,9 @@ SUBROUTINE create_qs_section(section,error)
wfi_ps_method_nr,&
wfi_frozen_method_nr,&
wfi_aspc_nr/),&
- default_i_val=wfi_aspc_nr, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=wfi_aspc_nr)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTRAPOLATION_ORDER",&
description="Order for the PS or ASPC extrapolation (typically 2-4). "//&
@@ -2786,9 +2641,9 @@ SUBROUTINE create_qs_section(section,error)
"for large systems, also at some cost. "//&
"In some cases, a high order extrapolation is not stable,"//&
" and the order needs to be reduced.",&
- usage="EXTRAPOLATION_ORDER {integer}",default_i_val=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EXTRAPOLATION_ORDER {integer}",default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="METHOD",&
description="Specifies the electronic structure method that should be employed",&
@@ -2813,9 +2668,9 @@ SUBROUTINE create_qs_section(section,error)
citations=(/Lippert1997,Lippert1999,Krack2000,VandeVondele2005a,&
VandeVondele2006,Dewar1977,Dewar1985,Rocha2006,Stewart1989,Thiel1992,&
Repasky2002,Stewart2007,Schenter2008/),&
- default_i_val=do_method_gpw, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_method_gpw)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORE_PPL",&
description="Specifies the method used to calculate the local pseudopotential contribution.",&
@@ -2824,60 +2679,58 @@ SUBROUTINE create_qs_section(section,error)
enum_desc=s2a("Analytic integration of integrals",&
"Numerical integration on real space grid. Lumped together with core charge"),&
enum_i_vals=(/ do_ppl_analytic, do_ppl_grid/), &
- default_i_val=do_ppl_analytic, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ppl_analytic)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_distribution_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_distribution_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_dftb_control_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dftb_control_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_scptb_control_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_scptb_control_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_se_control_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_se_control_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_mulliken_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mulliken_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ddapc_restraint_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ddapc_restraint_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_becke_restraint_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_becke_restraint_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_s2_restraint_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_s2_restraint_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_lrigpw_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_lrigpw_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_optimize_lri_basis_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_optimize_lri_basis_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qs_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_dftb_control_section(section,error)
+ SUBROUTINE create_dftb_control_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dftb_control_section', &
routineP = moduleN//':'//routineN
@@ -2888,65 +2741,64 @@ SUBROUTINE create_dftb_control_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DFTB",&
description="Parameters needed to set up the DFTB methods",&
n_keywords=1, n_subsections=1, repeats=.FALSE., &
- citations=(/Porezag1995, Seifert1996, Elstner1998, Zhechkov2005/),&
- error=error)
+ citations=(/Porezag1995, Seifert1996, Elstner1998, Zhechkov2005/))
NULLIFY(subsection)
- CALL create_dftb_parameter_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dftb_parameter_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(keyword)
CALL keyword_create(keyword, name="self_consistent",&
description="Use self-consistent method",&
citations=(/Elstner1998/),&
- usage="SELF_CONSISTENT",default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SELF_CONSISTENT",default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="orthogonal_basis",&
description="Assume orthogonal basis set",&
- usage="ORTHOGONAL_BASIS",default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORTHOGONAL_BASIS",default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="do_ewald",&
description="Use Ewald type method instead of direct sum for Coulomb interaction",&
- usage="DO_EWALD",default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_EWALD",default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="dispersion",&
description="Use dispersion correction",&
citations=(/Zhechkov2005/),lone_keyword_l_val=.TRUE.,&
- usage="DISPERSION",default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION",default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIAGONAL_DFTB3",&
description="Use a diagonal version of the 3rd order energy correction (DFTB3) ",&
lone_keyword_l_val=.TRUE.,&
- usage="DIAGONAL_DFTB3",default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DIAGONAL_DFTB3",default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HB_SR_GAMMA",&
description="Uses a modified version for the GAMMA within the SCC-DFTB scheme, "//&
"specifically tuned for hydrogen bonds.",&
citations=(/Hu2007/),lone_keyword_l_val=.TRUE.,&
- usage="HB_SR_GAMMA",default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="HB_SR_GAMMA",default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_disp",&
description="Define accuracy of dispersion interaction",&
- usage="EPS_DISP",default_r_val=0.0001_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DISP",default_r_val=0.0001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_dftb_control_section
@@ -2954,11 +2806,9 @@ END SUBROUTINE create_dftb_control_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_scptb_control_section(section,error)
+ SUBROUTINE create_scptb_control_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_scptb_control_section', &
routineP = moduleN//':'//routineN
@@ -2968,82 +2818,80 @@ SUBROUTINE create_scptb_control_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"SCPTB",&
description="Parameters needed to set up the SCPTB methods",&
- n_keywords=1, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword,name="PARAMETER_FILE_NAME",&
description="Specify file that contains the atomic parameters",&
usage="PARAMETER_FILE_NAME filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="DISPERSION_PARAMETER_FILE",&
description="Specify file that contains the atomic dispersion parameters",&
usage="DISPERSION_PARAMETER_FILE filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION",&
description="Use dispersion correction",&
lone_keyword_l_val=.TRUE.,&
- usage="DISPERSION",default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION",default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION_RADIUS",&
description="Define radius of dispersion interaction",&
- usage="DISPERSION_RADIUS",default_r_val=15._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION_RADIUS",default_r_val=15._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COORDINATION_CUTOFF",&
description="Define cutoff for coordination number calculation",&
- usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="D3_SCALING",&
description="Scaling parameters (s6,sr6,s8) for the D3 dispersion method,",&
- usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/1.0_dp,1.0_dp,1.0_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/1.0_dp,1.0_dp,1.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STO_NG",&
description="Provides the order of the Slater orbital expansion of Gaussian-Type Orbitals.",&
- usage="STO_NG",default_i_val=6, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STO_NG",default_i_val=6)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PAIR_CUTOFF",&
description="Define cutoff for pair potential calculation",&
- usage="PAIR_CUTOFF",default_r_val=1.e-8_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PAIR_CUTOFF",default_r_val=1.e-8_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="do_ewald",&
description="Use Ewald type method instead of direct sum for Coulomb interaction",&
- usage="DO_EWALD",default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_EWALD",default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="do_scc",&
description="Use self consistent charge method. Can be used together with DO_SCP to get TB method",&
- usage="DO_SCC",default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_SCC",default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="do_scp",&
description="Use SCP method. Can be used to switch off SCP to get a SCC-DFTB method",&
- usage="DO_SCP",default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_SCP",default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_scptb_control_section
@@ -3051,11 +2899,9 @@ END SUBROUTINE create_scptb_control_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_admm_section(section,error)
+ SUBROUTINE create_admm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_admm_section', &
routineP = moduleN//':'//routineN
@@ -3065,12 +2911,11 @@ SUBROUTINE create_admm_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"AUXILIARY_DENSITY_MATRIX_METHOD",&
description="Parameters needed for the ADMM method.",&
n_keywords=1, n_subsections=1, repeats=.FALSE., &
- citations=(/Guidon2010/),&
- error=error)
+ citations=(/Guidon2010/))
CALL keyword_create(&
keyword=keyword,&
@@ -3087,9 +2932,9 @@ SUBROUTINE create_admm_section(section,error)
"Calculate MO derivatives via Cauchy representation by inversion",&
"Perform original McWeeny purification via matrix multiplications",&
"Do not apply any purification, works directly with density matrix"), &
- default_i_val=do_admm_purify_mo_diag, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_admm_purify_mo_diag)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -3104,9 +2949,9 @@ SUBROUTINE create_admm_section(section,error)
" but use the original matrix for purification.",&
"Construct auxiliary density from a blocked Fock matrix.",&
"Construct auxiliary density from auxiliary basis enforcing charge constrain."),&
- default_i_val=do_admm_basis_projection, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_admm_basis_projection)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
@@ -3117,9 +2962,9 @@ SUBROUTINE create_admm_section(section,error)
enum_i_vals=(/do_admm_exch_scaling_none, do_admm_exch_scaling_merlot/),&
enum_desc=s2a("No scaling is enabled, refers to methods ADMM1, ADMM2 or ADMMQ.",&
"Exchange scaling according to Merlot (2014)"),&
- default_i_val=do_admm_exch_scaling_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_admm_exch_scaling_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -3134,35 +2979,33 @@ SUBROUTINE create_admm_section(section,error)
"No correction: X(D)-x(d)-> 0.",&
"Use OPTX functional for exchange correction.",&
"Use Becke88X functional for exchange correction."),&
- default_i_val=do_admm_aux_exch_func_default, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_admm_aux_exch_func_default)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BLOCK_LIST",&
description="Specifies a list of atoms.",&
usage="LIST {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_FILTER",&
description="Define accuracy of DBCSR operations",&
- usage="EPS_FILTER",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_FILTER",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_admm_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_dftb_parameter_section(section, error)
+ SUBROUTINE create_dftb_parameter_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_dftb_parameter_section', &
@@ -3173,37 +3016,36 @@ SUBROUTINE create_dftb_parameter_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PARAMETER",&
description="Information on where to find DFTB parameters",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword,name="SK_FILE",&
description="Define parameter file for atom pair",&
usage="SK_FILE a1 a2 filename",&
- n_var=3,type_of_var=char_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,type_of_var=char_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="PARAM_FILE_PATH",&
description="Specify the directory with the DFTB parameter files. "//&
"Used in combination with the filenames specified in the file "//&
"given in PARAM_FILE_NAME.", usage="PARAM_FILE_PATH pathname",&
- n_var=1,type_of_var=char_t,default_c_val="./",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="./")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="PARAM_FILE_NAME",&
description="Specify file that contains the names of "//&
"Slater-Koster tables: A plain text file, each line has the "//&
'format "ATOM1 ATOM2 filename.spl".',&
usage="PARAM_FILE_NAME filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION_TYPE",&
description="Use dispersion correction of the specified type."//&
@@ -3213,63 +3055,60 @@ SUBROUTINE create_dftb_parameter_section(section, error)
enum_i_vals=(/dispersion_uff, dispersion_d3/),&
enum_desc=s2a("Uses the UFF force field for a pair potential dispersion correction.",&
"Uses the Grimme D3 method (simplified) for a pair potential dispersion correction."),&
- default_i_val=dispersion_uff, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=dispersion_uff)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UFF_FORCE_FIELD",&
description="Name of file with UFF parameters that will be used "//&
"for the dispersion correction. Needs to be specified when "//&
"DISPERSION==.TRUE., otherwise cp2k crashes with a Segmentation "//&
"Fault.", usage="UFF_FORCE_FIELD filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="DISPERSION_PARAMETER_FILE",&
description="Specify file that contains the atomic dispersion "//&
"parameters for the D3 method",&
usage="DISPERSION_PARAMETER_FILE filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION_RADIUS",&
description="Define radius of dispersion interaction",&
- usage="DISPERSION_RADIUS",default_r_val=15._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION_RADIUS",default_r_val=15._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COORDINATION_CUTOFF",&
description="Define cutoff for coordination number calculation",&
- usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="D3_SCALING",&
description="Scaling parameters (s6,sr6,s8) for the D3 dispersion method,",&
- usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/0.0_dp,0.0_dp,0.0_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/0.0_dp,0.0_dp,0.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HB_SR_PARAM",&
description="Uses a modified version for the GAMMA within the SCC-DFTB scheme, "//&
"specifically tuned for hydrogen bonds. Specify the exponent used in the exponential.",&
- usage="HB_SR_PARAM {real}",default_r_val=4.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="HB_SR_PARAM {real}",default_r_val=4.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_dftb_parameter_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_se_control_section(section,error)
+ SUBROUTINE create_se_control_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_se_control_section', &
routineP = moduleN//':'//routineN
@@ -3281,38 +3120,35 @@ SUBROUTINE create_se_control_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"SE",&
description="Parameters needed to set up the Semi-empirical methods",&
- n_keywords=8, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=8, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="ORTHOGONAL_BASIS",&
description="Assume orthogonal basis set. This flag is overwritten by "//&
"methods with fixed orthogonal/non-orthogonal basis set.",&
- usage="ORTHOGONAL_BASIS",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORTHOGONAL_BASIS",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STO_NG",&
description="Provides the order of the Slater orbital expansion of Gaussian-Type Orbitals.",&
- usage="STO_NG",default_i_val=6, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STO_NG",default_i_val=6)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ANALYTICAL_GRADIENTS",&
description="Nuclear Gradients are computed analytically or numerically",&
- usage="ANALYTICAL_GRADIENTS",default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ANALYTICAL_GRADIENTS",default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA",&
description="Step size in finite difference force calculation",&
- usage="DELTA {real} ",default_r_val=1.e-6_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DELTA {real} ",default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTEGRAL_SCREENING",&
description="Specifies the functional form for the ",&
@@ -3324,9 +3160,9 @@ SUBROUTINE create_se_control_section(section,error)
"Uses a modified Klopman-Dewar-Sabelli-Ohno equation, dumping the screening "//&
"parameter for the Coulomb interactions.",&
"Uses an exponential Slater-type function for modelling the Coulomb interactions."),&
- default_i_val=do_se_IS_kdso, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_se_IS_kdso)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PERIODIC",&
description="Specifies the type of treatment for the electrostatic long-range part "//&
@@ -3342,97 +3178,92 @@ SUBROUTINE create_se_control_section(section,error)
"treatment for the 1/R^3 term, deriving from the short-range component. This option "//&
"is active only for K-DSO integral screening type.",&
"Use Ewald directly in Coulomb integral evaluation, works only with Slater screening"),&
- default_i_val=do_se_lr_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_se_lr_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FORCE_KDSO-D_EXCHANGE",&
description="This keywords forces the usage of the KDSO-D integral screening "//&
"for the Exchange integrals (default is to apply the screening only to the "//&
- "Coulomb integrals.",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Coulomb integrals.",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION",&
description="Use dispersion correction",&
lone_keyword_l_val=.TRUE.,&
- usage="DISPERSION",default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION",default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION_PARAMETER_FILE",&
description="Specify file that contains the atomic dispersion parameters",&
usage="DISPERSION_PARAMETER_FILE filename",&
- n_var=1,type_of_var=char_t,default_c_val="",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=char_t,default_c_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPERSION_RADIUS",&
description="Define radius of dispersion interaction",&
- usage="DISPERSION_RADIUS",default_r_val=15._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DISPERSION_RADIUS",default_r_val=15._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COORDINATION_CUTOFF",&
description="Define cutoff for coordination number calculation",&
- usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COORDINATION_CUTOFF",default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D3_SCALING",&
description="Scaling parameters (s6,sr6,s8) for the D3 dispersion method,",&
- usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/0.0_dp,0.0_dp,0.0_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="D3_SCALING 1.0 1.0 1.0", n_var=3, default_r_vals=(/0.0_dp,0.0_dp,0.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_coulomb_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_coulomb_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_exchange_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_exchange_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_screening_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_screening_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_lr_corr_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_lr_corr_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_neighbor_lists_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_neighbor_lists_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_se_memory_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_se_memory_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_se_print_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_se_print_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_se_ga_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_se_ga_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_se_control_section
! *****************************************************************************
!> \brief Create the COULOMB se section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \date 03.2009
!> \author Teodoro Laino [tlaino]
! *****************************************************************************
- SUBROUTINE create_lr_corr_section(section,error)
+ SUBROUTINE create_lr_corr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_lr_corr_section', &
routineP = moduleN//':'//routineN
@@ -3441,48 +3272,43 @@ SUBROUTINE create_lr_corr_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="LR_CORRECTION",&
description="Setup parameters for the evaluation of the long-range correction term in SE "//&
- "calculations.", n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ "calculations.", n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="CUTOFF",&
description="Atomic Cutoff Radius Cutoff for the evaluation of the long-ranbe correction integrals. ",&
usage="CUTOFF {real} ",unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(value=6.0_dp,unit_str="angstrom",error=error),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=6.0_dp,unit_str="angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_TAPER",&
description="Atomic Cutoff Radius Cutoff for Tapering the long-range correction integrals. "//&
"If not specified it assumes the same value specified for the CUTOFF.",&
- usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_RANGE",&
description="Range of cutoff switch function (tapering): 0.5*(1-TANH((r-r0)/RC_RANGE)), "//&
"where r0=2.0*RC_TAPER-20.0*RC_RANGE.",&
- usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_lr_corr_section
! *****************************************************************************
!> \brief Create the COULOMB se section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \date 03.2009
!> \author Teodoro Laino [tlaino]
! *****************************************************************************
- SUBROUTINE create_coulomb_section(section,error)
+ SUBROUTINE create_coulomb_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_coulomb_section', &
routineP = moduleN//':'//routineN
@@ -3491,11 +3317,10 @@ SUBROUTINE create_coulomb_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="COULOMB",&
description="Setup parameters for the evaluation of the COULOMB term in SE "//&
- "calculations.", n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ "calculations.", n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="CUTOFF",&
@@ -3503,38 +3328,34 @@ SUBROUTINE create_coulomb_section(section,error)
"For non-periodic calculation the default value is exactly the full cell dimension, in order "//&
"to evaluate all pair interactions. Instead, for periodic calculations the default numerical value is used." ,&
usage="CUTOFF {real} ",unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom",error=error),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_TAPER",&
description="Atomic Cutoff Radius Cutoff for Tapering Coulomb integrals. "//&
"If not specified it assumes the same value specified for the CUTOFF.",&
- usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_RANGE",&
description="Range of cutoff switch function (tapering): 0.5*(1-TANH((r-r0)/RC_RANGE)), "//&
"where r0=2.0*RC_TAPER-20.0*RC_RANGE.",&
- usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_coulomb_section
! *****************************************************************************
!> \brief Create the EXCHANGE se section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \date 03.2009
!> \author Teodoro Laino [tlaino]
! *****************************************************************************
- SUBROUTINE create_exchange_section(section,error)
+ SUBROUTINE create_exchange_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_exchange_section', &
routineP = moduleN//':'//routineN
@@ -3543,11 +3364,11 @@ SUBROUTINE create_exchange_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXCHANGE",&
description="Setup parameters for the evaluation of the EXCHANGE and "//&
" core Hamiltonian terms in SE calculations.", n_keywords=0, n_subsections=1,&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="CUTOFF",&
@@ -3557,38 +3378,34 @@ SUBROUTINE create_exchange_section(section,error)
"minimum value between 1/4 of the cell dimension and the value specified in input (either"//&
" explicitly defined or the default numerical value).",&
usage="CUTOFF {real} ",unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom",error=error),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_TAPER",&
description="Atomic Cutoff Radius Cutoff for Tapering Exchange integrals. "//&
"If not specified it assumes the same value specified for the CUTOFF.",&
- usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_TAPER {real} ",unit_str="angstrom",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_RANGE",&
description="Range of cutoff switch function (tapering): 0.5*(1-TANH((r-r0)/RC_RANGE)), "//&
"where r0=2.0*RC_TAPER-20.0*RC_RANGE.",&
- usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_exchange_section
! *****************************************************************************
!> \brief Create the SCREENING se section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \date 03.2009
!> \author Teodoro Laino [tlaino]
! *****************************************************************************
- SUBROUTINE create_screening_section(section,error)
+ SUBROUTINE create_screening_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_screening_section', &
routineP = moduleN//':'//routineN
@@ -3597,40 +3414,35 @@ SUBROUTINE create_screening_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SCREENING",&
description="Setup parameters for the tapering of the Coulomb/Exchange Screening in "//&
- "KDSO-D integral scheme,", n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ "KDSO-D integral scheme,", n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="RC_TAPER",&
description="Atomic Cutoff Radius Cutoff for Tapering the screening term. ",&
usage="RC_TAPER {real} ",unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom",error=error),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=12.0_dp,unit_str="angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RC_RANGE",&
description="Range of cutoff switch function (tapering): 0.5*(1-TANH((r-r0)/RC_RANGE)), "//&
"where r0=2*RC_TAPER-20*RC_RANGE.",&
- usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RC_RANGE {real} ",unit_str="angstrom",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_screening_section
! *****************************************************************************
!> \brief Create the print se section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_se_print_section(section,error)
+ SUBROUTINE create_se_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_se_print_section', &
routineP = moduleN//':'//routineN
@@ -3639,48 +3451,42 @@ SUBROUTINE create_se_print_section(section,error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options in SE code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"NEIGHBOR_LISTS",&
description="Activates the printing of the neighbor lists used"//&
" for the periodic SE calculations.", &
- print_level=high_print_level,filename="",unit_str="angstrom",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="",unit_str="angstrom")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SUBCELL",&
description="Activates the printing of the subcells used for the"//&
"generation of neighbor lists for periodic SE.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"EWALD_INFO",&
description="Activates the printing of the information for "//&
"Ewald multipole summation in periodic SE.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_se_print_section
! *****************************************************************************
!> \brief creates the input section for use with the GA part of the code
!> \param section the section to create
-!> \param error ...
!> \author Teodoro Laino [tlaino] - University of Zurich - 05.2008
! *****************************************************************************
- SUBROUTINE create_se_ga_section(section,error)
+ SUBROUTINE create_se_ga_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_se_ga_section', &
routineP = moduleN//':'//routineN
@@ -3690,11 +3496,10 @@ SUBROUTINE create_se_ga_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"GA",&
description="Sets up memory parameters for the storage of the integrals",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(&
@@ -3703,22 +3508,18 @@ SUBROUTINE create_se_ga_section(section,error)
description="Defines the number of linked cells for the neighbor list. "//&
"Default value is number of processors",&
usage="NCELLS 10",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_se_ga_section
! *****************************************************************************
!> \brief creates the input section for the se-memory part integral storage
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - University of Zurich - 05.2008
! *****************************************************************************
- SUBROUTINE create_se_memory_section(section,error)
+ SUBROUTINE create_se_memory_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_se_memory_section', &
routineP = moduleN//':'//routineN
@@ -3728,21 +3529,19 @@ SUBROUTINE create_se_memory_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"MEMORY",&
description="Sets up memory parameters for the storage of the integrals",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(&
keyword=keyword,&
name="EPS_STORAGE",&
description="Storage threshold for compression is EPS_STORAGE",&
usage="EPS_STORAGE 1.0E-10",&
- default_r_val=1.0E-10_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -3750,17 +3549,16 @@ SUBROUTINE create_se_memory_section(section,error)
description="Defines the maximum amount of memory [MB] used to store precomputed "//&
"(possibly compressed) two-electron two-center integrals",&
usage="MAX_MEMORY 256",&
- default_i_val=50,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COMPRESS",&
description="Enables the compression of the integrals in memory.",&
usage="COMPRESS ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_se_memory_section
@@ -3768,11 +3566,9 @@ END SUBROUTINE create_se_memory_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_mulliken_section(section,error)
+ SUBROUTINE create_mulliken_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mulliken_section', &
routineP = moduleN//':'//routineN
@@ -3782,41 +3578,38 @@ SUBROUTINE create_mulliken_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"MULLIKEN_RESTRAINT",&
description="Use mulliken charges in a restraint (check code for details)",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="STRENGTH",&
description="force constant of the restraint",&
- usage="STRENGTH {real} ",default_r_val=0.1_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRENGTH {real} ",default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="target value of the restraint",&
- usage="TARGET {real} ",default_r_val=1._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TARGET {real} ",default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the list of atoms that is summed in the restraint",&
usage="ATOMS {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mulliken_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_density_fitting_section(section,error)
+ SUBROUTINE create_density_fitting_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_density_fitting_section', &
@@ -3828,65 +3621,63 @@ SUBROUTINE create_density_fitting_section(section,error)
failure=.FALSE.
NULLIFY(keyword, print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DENSITY_FITTING",&
description="Setup parameters for density fitting (Bloechl charges or density derived "//&
" atomic point charges (DDAPC) charges)",&
n_keywords=7, n_subsections=0, repeats=.FALSE., &
- citations=(/Blochl1995/),&
- error=error)
+ citations=(/Blochl1995/))
CALL keyword_create(keyword, name="NUM_GAUSS",&
description="Specifies the numbers of gaussian used to fit the QM density for each atomic site.",&
usage="NUM_GAUSS {integer}", &
- n_var=1, type_of_var=integer_t, default_i_val=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=integer_t, default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PFACTOR",&
description="Specifies the progression factor for the gaussian exponent for each atomic site.",&
usage="PFACTOR {real}", &
- n_var=1, type_of_var=real_t, default_r_val=1.5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=real_t, default_r_val=1.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_RADIUS",&
description="Specifies the smallest radius of the gaussian used in the fit. All other radius are"//&
" obtained with the progression factor.",&
usage="MIN_RADIUS {real}", &
- unit_str="angstrom",n_var=1, type_of_var=real_t, default_r_val=0.5_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom",n_var=1, type_of_var=real_t, default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADII",&
description="Specifies all the radius of the gaussian used in the fit for each atomic site. The use"//&
" of this keyword disables all other keywords of this section.",&
usage="RADII {real} {real} .. {real}", &
- unit_str="angstrom",n_var=-1, type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom",n_var=-1, type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GCUT",&
description="Cutoff for charge fit in G-space.",&
usage="GCUT {real}", &
- n_var=1, type_of_var=real_t, default_r_val=SQRT(6.0_dp),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, type_of_var=real_t, default_r_val=SQRT(6.0_dp))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing of basic information during the run", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
CALL keyword_create(keyword, name="CONDITION_NUMBER",&
description="Prints information regarding the condition numbers of the A matrix (to be inverted)",&
usage="ANALYTICAL_GTERM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_density_fitting_section
@@ -3894,11 +3685,9 @@ END SUBROUTINE create_density_fitting_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ddapc_restraint_section(section,error)
+ SUBROUTINE create_ddapc_restraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_ddapc_restraint_section', &
@@ -3910,11 +3699,10 @@ SUBROUTINE create_ddapc_restraint_section(section,error)
failure=.FALSE.
NULLIFY(keyword, print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DDAPC_RESTRAINT",&
description="Use DDAPC charges in a restraint (check code for details)",&
- n_keywords=7, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="TYPE_OF_DENSITY",&
description="Specifies the type of density used for the fitting",&
@@ -3922,35 +3710,35 @@ SUBROUTINE create_ddapc_restraint_section(section,error)
enum_c_vals=s2a("FULL","SPIN"),&
enum_i_vals=(/ do_full_density, do_spin_density/),&
enum_desc=s2a("Full density","Spin density"),&
- default_i_val=do_full_density, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_full_density)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STRENGTH",&
description="force constant of the restraint",&
- usage="STRENGTH {real} ",default_r_val=0.1_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRENGTH {real} ",default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="target value of the restraint",&
- usage="TARGET {real} ",default_r_val=1._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TARGET {real} ",default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the list of atoms that is summed in the restraint",&
usage="ATOMS {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="COEFF",&
description="Defines the the coefficient of the atom in the atom list (default is one) ",&
usage="COEFF 1.0 -1.0",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTIONAL_FORM",&
description="Specifies the functional form of the term added",&
@@ -3958,16 +3746,15 @@ SUBROUTINE create_ddapc_restraint_section(section,error)
enum_c_vals=s2a("RESTRAINT","CONSTRAINT"),&
enum_i_vals=(/ do_ddapc_restraint, do_ddapc_constraint/),&
enum_desc=s2a("Harmonic potential: s*(q-t)**2","Constraint form: s*(q-t)"),&
- default_i_val=do_ddapc_restraint, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ddapc_restraint)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_ddapc_restraint_section
@@ -3975,11 +3762,9 @@ END SUBROUTINE create_ddapc_restraint_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_becke_restraint_section(section,error)
+ SUBROUTINE create_becke_restraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_becke_restraint_section', &
@@ -3991,37 +3776,36 @@ SUBROUTINE create_becke_restraint_section(section,error)
failure=.FALSE.
NULLIFY(keyword, print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"BECKE_RESTRAINT",&
description="Use Becke weight population in a restraint/constraint ",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="STRENGTH",&
description="force constant of the restraint",&
- usage="STRENGTH {real} ",default_r_val=0.1_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRENGTH {real} ",default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="target value of the restraint",&
- usage="TARGET {real} ",default_r_val=1._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TARGET {real} ",default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the list of atoms that is summed in the restraint",&
usage="ATOMS {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="COEFF",&
description="Defines the the coefficient of the atom in the atom list (default is one)",&
usage="COEFF 1.0 -1.0",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTIONAL_FORM",&
description="Specifies the functional form of the term added",&
@@ -4029,9 +3813,9 @@ SUBROUTINE create_becke_restraint_section(section,error)
enum_c_vals=s2a("RESTRAINT","CONSTRAINT"),&
enum_i_vals=(/ do_ddapc_restraint, do_ddapc_constraint/),&
enum_desc=s2a("Harmonic potential: s*(q-t)**2","Constraint form: s*(q-t)"),&
- default_i_val=do_ddapc_restraint, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ddapc_restraint)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE_OF_DENSITY",&
description="Specifies the type of density used for the fitting",&
@@ -4039,16 +3823,15 @@ SUBROUTINE create_becke_restraint_section(section,error)
enum_c_vals=s2a("FULL","SPIN"),&
enum_i_vals=(/ do_full_density, do_spin_density/),&
enum_desc=s2a("Full density","Spin density"),&
- default_i_val=do_full_density, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_full_density)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_becke_restraint_section
@@ -4056,11 +3839,9 @@ END SUBROUTINE create_becke_restraint_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_s2_restraint_section(section,error)
+ SUBROUTINE create_s2_restraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_s2_restraint_section', &
routineP = moduleN//':'//routineN
@@ -4070,24 +3851,23 @@ SUBROUTINE create_s2_restraint_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"S2_RESTRAINT",&
description="Use S2 in a re/constraint (OT only)",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="STRENGTH",&
description="force constant of the restraint",&
- usage="STRENGTH {real} ",default_r_val=0.1_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRENGTH {real} ",default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="target value of the restraint",&
- usage="TARGET {real} ",default_r_val=1._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TARGET {real} ",default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTIONAL_FORM",&
description="Specifies the functional form of the term added",&
@@ -4095,9 +3875,9 @@ SUBROUTINE create_s2_restraint_section(section,error)
enum_c_vals=s2a("RESTRAINT","CONSTRAINT"),&
enum_i_vals=(/ do_s2_restraint, do_s2_constraint/),&
enum_desc=s2a("Harmonic potential: s*(q-t)**2","Constraint form: s*(q-t)"),&
- default_i_val=do_s2_restraint, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_s2_restraint)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_s2_restraint_section
@@ -4105,13 +3885,10 @@ END SUBROUTINE create_s2_restraint_section
! *****************************************************************************
!> \brief creates the input section for the tddfpt part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_tddfpt_section(section,error)
+ SUBROUTINE create_tddfpt_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_tddfpt_section', &
routineP = moduleN//':'//routineN
@@ -4122,11 +3899,11 @@ SUBROUTINE create_tddfpt_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"tddfpt",&
description="parameters needed to set up the Time Dependent Density Functional PT",&
n_keywords=5, n_subsections=1, repeats=.FALSE., &
- citations=(/Iannuzzi2005/),error=error)
+ citations=(/Iannuzzi2005/))
NULLIFY(subsection,keyword)
@@ -4136,76 +3913,76 @@ SUBROUTINE create_tddfpt_section(section,error)
description=" maximal number of Krylov space vectors",&
usage="MAX_KV someInteger>0",&
n_var=1,type_of_var=integer_t,&
- default_i_val=60, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=60)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTARTS",&
variants=s2a("N_RESTARTS"),&
description=" maximal number subspace search restarts",&
usage="RESTARTS someInteger>0",&
n_var=1,type_of_var=integer_t,&
- default_i_val=5, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NEV",&
variants=s2a("N_EV", "EV"),&
description=" number of excitations to calculate",&
usage="NEV someInteger>0",&
n_var=1,type_of_var=integer_t,&
- default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NLUMO",&
description=" number of additional unoccupied orbitals ",&
usage="NLUMO 10",&
n_var=1,type_of_var=integer_t,&
- default_i_val=5, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NREORTHO",&
variants=s2a("N_REORTHO","REORTHO","REORTHOGONALITAZIONS"),&
description=" number of reorthogonalization steps",&
usage="NREORTHO someInteger>0",&
n_var=1,type_of_var=integer_t,&
- default_i_val=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logical
CALL keyword_create(keyword, name="KERNEL",&
variants=s2a("DO_KERNEL"),&
description="compute the kernel (debug purpose only)",&
usage="KERNEL logical_value",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LSD_SINGLETS",&
description="compute singlets using lsd vxc kernel",&
usage="LSD_SINGLETS logical_value",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INVERT_S",&
variants=s2a("INVERT_OVERLAP"),&
description="use the inverse of the overlap matrix",&
usage="INVERT_S logical_value",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECONDITIONER",&
variants=s2a("PRECOND"),&
description="use the preconditioner (only for Davidson)",&
usage="PRECONDITIONER logical_value",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Character
CALL keyword_create(keyword, name="RES_ETYPE",&
@@ -4215,9 +3992,9 @@ SUBROUTINE create_tddfpt_section(section,error)
enum_c_vals=s2a("S","SINGLET","SINGLETS","T","TRIPLET","TRIPLETS"),&
enum_i_vals=(/ tddfpt_singlet, tddfpt_singlet, tddfpt_singlet,&
tddfpt_triplet, tddfpt_triplet, tddfpt_triplet/),&
- default_i_val=tddfpt_singlet, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=tddfpt_singlet)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIAG_METHOD",&
variants=s2a("DIAGONALIZATION_METHOD", "METHOD"),&
@@ -4225,9 +4002,9 @@ SUBROUTINE create_tddfpt_section(section,error)
usage="DIAG_METHOD DAVIDSON",&
enum_c_vals=s2a("DAVIDSON","LANCZOS"),&
enum_i_vals=(/ tddfpt_davidson, tddfpt_lanczos/),&
- default_i_val=tddfpt_davidson, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=tddfpt_davidson)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OE_CORR",&
variants=s2a("ORBITAL_EIGENVALUES_CORRECTION"),&
@@ -4236,9 +4013,9 @@ SUBROUTINE create_tddfpt_section(section,error)
usage="OE_CORR SAOP",&
enum_c_vals=s2a("NONE", "LB", "LB_ALPHA", "LB94", "GLLB", "GLB", "SAOP","SIC"),&
enum_i_vals=(/ oe_none, oe_lb, oe_lb, oe_lb, oe_gllb, oe_gllb, oe_saop, oe_sic /),&
- default_i_val=oe_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=oe_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Real
CALL keyword_create(keyword, name="CONVERGENCE",&
@@ -4246,30 +4023,27 @@ SUBROUTINE create_tddfpt_section(section,error)
description="The convergence of the eigenvalues",&
usage="CONVERGENCE 1.0E-6 ",&
n_var=1,type_of_var=real_t,&
- default_r_val=1.0e-5_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_xc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_xc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_sic_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_sic_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_tddfpt_section
! *****************************************************************************
!> \brief creates the input section for the relativistic part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jens
! *****************************************************************************
- SUBROUTINE create_relativistic_section(section,error)
+ SUBROUTINE create_relativistic_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_relativistic_section', &
routineP = moduleN//':'//routineN
@@ -4279,11 +4053,10 @@ SUBROUTINE create_relativistic_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"relativistic",&
description="parameters needed and setup for relativistic calculations",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -4294,15 +4067,15 @@ SUBROUTINE create_relativistic_section(section,error)
enum_i_vals=(/ rel_none, rel_dkh, rel_zora /),&
enum_desc=s2a("Use no relativistic correction",&
"Use Douglas-Kroll-Hess method",&
- "Use ZORA method"), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use ZORA method"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DKH_order",&
description="The order of the DKH transformation ",&
- usage="DKH_order 2", default_i_val=2,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DKH_order 2", default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ZORA_type",&
description="Type of ZORA method to be used",&
@@ -4311,9 +4084,9 @@ SUBROUTINE create_relativistic_section(section,error)
enum_desc=s2a("Full ZORA method (not implemented)",&
"ZORA with atomic model potential",&
"Scaled ZORA with atomic model potential"),&
- enum_i_vals=(/ rel_zora_full, rel_zora_mp, rel_sczora_mp/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ rel_zora_full, rel_zora_mp, rel_sczora_mp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="transformation",&
description="Type of DKH transformation",&
@@ -4322,36 +4095,33 @@ SUBROUTINE create_relativistic_section(section,error)
enum_i_vals=(/ rel_trans_full, rel_trans_molecule, rel_trans_atom/),&
enum_desc=s2a("Use full matrix transformation",&
"Use transformation blocked by molecule",&
- "Use atomic blocks"),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use atomic blocks"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="z_cutoff",&
description="The minimal atomic number considered for atom transformation",&
- usage="z_cutoff 50", default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="z_cutoff 50", default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="potential",&
description="External potential used in DKH transformation, full 1/r or erfc(r)/r",&
usage="POTENTIAL {FULL,ERFC}", default_i_val=rel_pot_erfc,&
enum_c_vals=s2a("FULL","ERFC"),&
- enum_i_vals=(/ rel_pot_full, rel_pot_erfc /),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ rel_pot_full, rel_pot_erfc /))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_relativistic_section
! *****************************************************************************
!> \brief creates the structure of the section with the DFT SCF parameters
!> \param section will contain the SCF section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_scf_section(section,error)
+ SUBROUTINE create_scf_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_scf_section', &
routineP = moduleN//':'//routineN
@@ -4363,89 +4133,86 @@ SUBROUTINE create_scf_section(section,error)
failure=.FALSE.
NULLIFY(print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"scf",&
description="Parameters needed perform an SCF run.",&
- n_keywords=24, n_subsections=3, repeats=.FALSE., &
- error=error)
+ n_keywords=24, n_subsections=3, repeats=.FALSE.)
NULLIFY (subsection)
- CALL create_ot_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ot_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_diagonalization_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_diagonalization_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_outer_scf_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_outer_scf_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_smear_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_smear_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_mixing_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mixing_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY (keyword)
CALL keyword_create(keyword, name="MAX_ITER_LUMO",&
variants=(/"MAX_ITER_LUMOS"/),&
description="The maximum number of iteration for the lumo computation",&
- usage="MAX_ITER_LUMO 100", default_i_val=299,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER_LUMO 100", default_i_val=299)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_LUMO",&
variants=(/"EPS_LUMOS"/),&
description="target accuracy of the computation of the lumo energy",&
- usage="EPS_LUMO 1.e-6", default_r_val=1.0e-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_LUMO 1.e-6", default_r_val=1.0e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_SCF",&
description="Maximum number of SCF iteration to be performed for one optimization",&
- usage="MAX_SCF 200", default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_SCF 200", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_SCF_HISTORY", variants=(/"MAX_SCF_HIST"/), &
description="Maximum number of SCF iterations after the history pipeline is filled", &
- usage="MAX_SCF_HISTORY 1", default_i_val=0,lone_keyword_i_val=1, &
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="MAX_SCF_HISTORY 1", default_i_val=0,lone_keyword_i_val=1)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_DIIS",&
variants=(/"MAX_DIIS_BUFFER_SIZE"/),&
description="Maximum number of DIIS vectors to be used",&
- usage="MAX_DIIS 3", default_i_val=4,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_DIIS 3", default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LEVEL_SHIFT",&
variants=(/"LSHIFT"/),&
description="Use level shifting to improve convergence",&
- usage="LEVEL_SHIFT 0.1", default_r_val=0._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LEVEL_SHIFT 0.1", default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SCF",&
description="Target accuracy for the SCF convergence.",&
- usage="EPS_SCF 1.e-6", default_r_val=1.e-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 1.e-6", default_r_val=1.e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SCF_HISTORY", variants=(/"EPS_SCF_HIST"/), &
description="Target accuracy for the SCF convergence after the history pipeline is filled.",&
- usage="EPS_SCF_HISTORY 1.e-5", default_r_val=0.0_dp,lone_keyword_r_val=1.0e-5_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF_HISTORY 1.e-5", default_r_val=0.0_dp,lone_keyword_r_val=1.0e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHOLESKY",&
description="If the cholesky method should be used for computing "//&
@@ -4456,22 +4223,21 @@ SUBROUTINE create_scf_section(section,error)
"Reduce is replaced by two restore",&
"Restore uses operator multiply by inverse of the triangular matrix",&
"Like inverse, but matrix stored as dbcsr, sparce matrix algebra used when possible"),&
- enum_i_vals=(/cholesky_off,cholesky_reduce,cholesky_restore,cholesky_inverse,cholesky_dbcsr/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/cholesky_off,cholesky_reduce,cholesky_restore,cholesky_inverse,cholesky_dbcsr/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_EIGVAL",&
description="Throw away linear combinations of basis functions with a small eigenvalue in S",&
- usage="EPS_EIGVAL 1.0", default_r_val=1.0e-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_EIGVAL 1.0", default_r_val=1.0e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_DIIS",&
description="Threshold on the convergence to start using DIAG/DIIS",&
- usage="EPS_DIIS 5.0e-2", default_r_val=0.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DIIS 5.0e-2", default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCF_GUESS",&
description="Change the initial guess for the wavefunction.",&
@@ -4488,28 +4254,27 @@ SUBROUTINE create_scf_section(section,error)
"Generate a sparse wavefunction using the atomic code (for OT based methods)", &
"Skip initial guess (only for NON-SCC DFTB)."), &
enum_i_vals=(/atomic_guess,restart_guess,random_guess,core_guess,&
- densities_guess,history_guess,mopac_guess,sparse_guess,no_guess/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ densities_guess,history_guess,mopac_guess,sparse_guess,no_guess/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NROW_BLOCK",&
description="sets the number of rows in a scalapack block",&
- usage="NROW_BLOCK 31", default_i_val=32,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NROW_BLOCK 31", default_i_val=32)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NCOL_BLOCK",&
description="Sets the number of columns in a scalapack block",&
- usage="NCOL_BLOCK 31", default_i_val=32,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NCOL_BLOCK 31", default_i_val=32)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ADDED_MOS",&
description="Number of additional MOS added for each spin",&
- usage="ADDED_MOS", default_i_val=0,n_var=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ADDED_MOS", default_i_val=0,n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="ROKS_SCHEME",&
@@ -4519,10 +4284,9 @@ SUBROUTINE create_scf_section(section,error)
n_var=1,&
enum_c_vals=s2a("GENERAL","HIGH-SPIN"),&
enum_i_vals=(/general_roks,high_spin_roks/),&
- default_i_val=high_spin_roks,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=high_spin_roks)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="ROKS_F",&
@@ -4533,10 +4297,9 @@ SUBROUTINE create_scf_section(section,error)
repeats=.FALSE.,&
n_var=1,&
type_of_var=real_t,&
- default_r_val=0.5_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="ROKS_PARAMETERS",&
@@ -4549,13 +4312,12 @@ SUBROUTINE create_scf_section(section,error)
repeats=.FALSE.,&
n_var=6,&
type_of_var=real_t,&
- default_r_vals=(/-0.5_dp,1.5_dp,0.5_dp,0.5_dp,1.5_dp,-0.5_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/-0.5_dp,1.5_dp,0.5_dp,0.5_dp,1.5_dp,-0.5_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,"PRINT", "Printing of information during the SCF.",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"RESTART",&
description="Controls the dumping of the MO restart file during SCF."//&
@@ -4563,128 +4325,115 @@ SUBROUTINE create_scf_section(section,error)
"See also RESTART_HISTORY", &
print_level=low_print_level, common_iter_levels=3,&
each_iter_names=s2a("QS_SCF"),each_iter_values=(/20/), &
- add_last=add_last_numeric,filename="RESTART",error=error)
+ add_last=add_last_numeric,filename="RESTART")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum index of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=3, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART_HISTORY",&
description="Dumps unique MO restart files during the run keeping all of them.",&
print_level=low_print_level, common_iter_levels=0,&
each_iter_names=s2a("__ROOT__","MD","GEO_OPT","ROT_OPT","NEB","METADYNAMICS","QS_SCF"),&
each_iter_values=(/500,500,500,500,500,500,500/), &
- filename="RESTART",error=error)
+ filename="RESTART")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum index of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=3, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"iteration_info",&
description="Controls the printing of basic iteration information during the SCF.", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
CALL keyword_create(keyword, name="time_cumul",&
description="If the printkey is activated switches the printing of timings"//&
" to cumulative (over the SCF).",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing of basic information during the SCF.", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"MO_ORTHONORMALITY",&
description="Controls the printing relative to the orthonormality of MOs (CT S C).", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"MO_MAGNITUDE",&
description="Prints the min/max eigenvalues of the overlap of the MOs without S (CT C).", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"detailed_energy",&
description="Controls the printing of detailed energy information.", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"diis_info",&
description="Controls the printing of DIIS information.", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"total_densities",&
description="Controls the printing of total densities.", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"Lanczos",&
description="Controls the printing of information on Lanczos refinement iterations.", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DIAG_SUB_SCF",&
description="Controls the printing of information on subspace diagonalization internal loop. ", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"Davidson",&
description="Controls the printing of information on Davidson iterations.", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FILTER_MATRIX",&
description="Controls the printing of information on Filter Matrix method.", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_scf_section
! *****************************************************************************
!> \brief creates the KG section
!> \param section ...
-!> \param error ...
!> \author Martin Haeufel [2012.07]
! *****************************************************************************
- SUBROUTINE create_kg_section(section,error)
+ SUBROUTINE create_kg_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_kg_section', &
routineP = moduleN//':'//routineN
@@ -4695,12 +4444,12 @@ SUBROUTINE create_kg_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"KG_METHOD",&
description="Specifies the parameters for a Kim-Gordon-like partitioning"//&
" into molecular subunits",&
n_keywords=0, n_subsections=1, repeats=.FALSE., &
- citations=(/Iannuzzi2006, Brelaz1979/),error=error)
+ citations=(/Iannuzzi2006, Brelaz1979/))
NULLIFY (keyword, subsection, print_key)
@@ -4711,10 +4460,9 @@ SUBROUTINE create_kg_section(section,error)
enum_c_vals=s2a( "DSATUR", "GREEDY"),&
enum_desc=s2a("Maximum degree of saturation, relatively accurate",&
"Greedy, fast coloring, less accurate"),&
- enum_i_vals=(/kg_color_dsatur, kg_color_greedy /),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/kg_color_dsatur, kg_color_greedy /))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TNADD_METHOD",&
description="Algorithm to use for the calculation of the nonadditive kinetic energy.",&
@@ -4723,56 +4471,50 @@ SUBROUTINE create_kg_section(section,error)
enum_c_vals=s2a( "EMBEDDING", "ATOMIC"),&
enum_desc=s2a("Use full embedding potential (see Iannuzzi et al)",&
"Use sum of atomic model potentials"),&
- enum_i_vals=(/kg_tnadd_embed, kg_tnadd_atomic /),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/kg_tnadd_embed, kg_tnadd_atomic /))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection, name="PRINT",&
description="Print section",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"NEIGHBOR_LISTS",&
description="Controls the printing of the neighbor lists.", &
- print_level=low_print_level, filename="__STD_OUT__", unit_str="angstrom",&
- error=error)
+ print_level=low_print_level, filename="__STD_OUT__", unit_str="angstrom")
CALL keyword_create(keyword=keyword,&
name="SAB_ORB_FULL",&
description="Activates the printing of the full orbital "//&
"orbital neighbor lists.", &
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="SAB_ORB_MOLECULAR",&
description="Activates the printing of the orbital "//&
"orbital neighbor lists for molecular subsets.",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="SAC_KIN",&
description="Activates the printing of the orbital "//&
"atomic potential neighbor list.",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection, print_key, error=error)
- CALL section_release(print_key, error=error)
+ CALL section_add_subsection(subsection, print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_kg_section
@@ -4781,13 +4523,10 @@ END SUBROUTINE create_kg_section
!> \brief creates the structure of the section with SCF parameters
!> controlling an other loop
!> \param section will contain the SCF section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele [2006.03]
! *****************************************************************************
- SUBROUTINE create_outer_scf_section(section,error)
+ SUBROUTINE create_outer_scf_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_outer_scf_section', &
routineP = moduleN//':'//routineN
@@ -4796,20 +4535,18 @@ SUBROUTINE create_outer_scf_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"OUTER_SCF",&
description="parameters controlling the outer SCF loop",&
- n_keywords=9, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=9, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the outer SCF loop",&
- usage="&OUTER_SCF ON",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="&OUTER_SCF ON",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE",&
description="Specifies which kind of outer SCF should be employed",&
@@ -4821,10 +4558,9 @@ SUBROUTINE create_outer_scf_section(section,error)
"Enforce a constraint on the Becke weight population,requires the corresponding section", &
"Do nothing in the outer loop, useful for resetting the inner loop,"),&
enum_i_vals=(/outer_scf_ddapc_constraint,outer_scf_s2_constraint,&
- outer_scf_becke_constraint,outer_scf_none/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ outer_scf_becke_constraint,outer_scf_none/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OPTIMIZER",&
description="Method used to bring the outer loop to a stationary point",&
@@ -4835,17 +4571,16 @@ SUBROUTINE create_outer_scf_section(section,error)
"Uses a Direct Inversion in the Iterative Subspace method", &
"Do nothing, useful only with the none type",&
"Bisection on the gradient, useful for difficult one dimensional cases"),&
- enum_i_vals=(/outer_scf_optimizer_sd,outer_scf_optimizer_diis,outer_scf_optimizer_none,outer_scf_optimizer_bisect/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/outer_scf_optimizer_sd,outer_scf_optimizer_diis,outer_scf_optimizer_none,outer_scf_optimizer_bisect/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BISECT_TRUST_COUNT",&
description="Maximum number of times the same point will be used in bisection,"//&
" a small number guards against the effect of wrongly converged states.", &
- usage="BISECT_TRUST_COUNT 5", default_i_val=10,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="BISECT_TRUST_COUNT 5", default_i_val=10)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SCF",&
description="The target gradient of the outer SCF variables. "//&
@@ -4853,35 +4588,35 @@ SUBROUTINE create_outer_scf_section(section,error)
"the value that can be reached in the outer loop, "//&
"typically EPS_SCF of the outer loop must be smaller "//&
"than EPS_SCF of the inner loop.", &
- usage="EPS_SCF 1.0E-6 ", default_r_val=1.0E-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 1.0E-6 ", default_r_val=1.0E-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIIS_BUFFER_LENGTH",&
description="Maximum number of DIIS vectors used ", &
- usage="DIIS_BUFFER_LENGTH 5", default_i_val=3,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DIIS_BUFFER_LENGTH 5", default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTRAPOLATION_ORDER",&
description="Number of past states used in the extrapolation of the variables during e.g. MD", &
- usage="EXTRAPOLATION_ORDER 5", default_i_val=3,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EXTRAPOLATION_ORDER 5", default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_SCF",&
description="The maximum number of outer loops ", &
- usage="MAX_SCF 20", default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_SCF 20", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEP_SIZE",&
description="The initial step_size used in the optimizer (currently steepest descent)."//&
"Note that in cases where a sadle point is sought for (DDAPC_CONSTRAINT),"//&
" this can be negative", &
- usage="STEP_SIZE -1.0", default_r_val=0.5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STEP_SIZE -1.0", default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_outer_scf_section
@@ -4890,13 +4625,10 @@ END SUBROUTINE create_outer_scf_section
! *****************************************************************************
!> \brief Create the BSSE section for counterpoise correction
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_bsse_section(section,error)
+ SUBROUTINE create_bsse_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_bsse_section', &
routineP = moduleN//':'//routineN
@@ -4907,50 +4639,47 @@ SUBROUTINE create_bsse_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BSSE",&
description="This section is used to set up the BSSE calculation. "//&
"It also requires that for each atomic kind X a kind X_ghost is present, "//&
"with the GHOST keyword specified, in addition to the other required fields.",&
- n_keywords=3, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=3, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword, subsection)
! FRAGMENT SECTION
CALL section_create(subsection,name="FRAGMENT",&
description="Specify the atom number belonging to this fragment.",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of atoms.",&
usage="LIST {integer} {integer} .. {integer}", &
- repeats=.TRUE., n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE., n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! CONFIGURATION SECTION
CALL section_create(subsection,name="CONFIGURATION",&
description="Specify additional parameters for the combinatorial configurations.",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="GLB_CONF",&
description="Specifies the global configuration using 1 or 0.",&
usage="GLB_CONF {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SUB_CONF",&
description="Specifies the subconfiguration using 1 or 0 belonging to the global configuration.",&
usage="SUB_CONF {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="MULTIPLICITY",&
@@ -4959,36 +4688,34 @@ SUBROUTINE create_bsse_section(section,error)
"Specify 3 for a triplet, 4 for a quartet,and so on. Default is 1 (singlet) for an "//&
"even number and 2 (doublet) for an odd number of electrons.",&
usage="MULTIPLICITY 3",&
- default_i_val=0,& ! this default value is just a flag to get the above
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0) ! this default value is just a flag to get the above
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE",&
description="The total charge for each fragment.",&
usage="CHARGE -1",&
- default_i_val=0,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="FRAGMENT_ENERGIES",&
description="This section contains the energies of the fragments already"//&
" computed. It is useful as a summary and specifically for restarting BSSE runs.",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The energy computed for each fragment",repeats=.TRUE.,&
- usage="{REAL}", type_of_var=real_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ usage="{REAL}", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_print_bsse_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_bsse_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_bsse_section
@@ -4996,13 +4723,10 @@ END SUBROUTINE create_bsse_section
! *****************************************************************************
!> \brief Create the print bsse section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_print_bsse_section(section,error)
+ SUBROUTINE create_print_bsse_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_bsse_section', &
routineP = moduleN//':'//routineN
@@ -5012,41 +4736,36 @@ SUBROUTINE create_print_bsse_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options in BSSE code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of information regarding the run.",&
- print_level=low_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART",&
description="Controls the dumping of the restart file during BSSE runs."//&
"By default the restart is updated after each configuration calculation is "//&
" completed.", &
print_level=silent_print_level, common_iter_levels=0, &
- add_last=add_last_numeric,filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric,filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_bsse_section
! *****************************************************************************
!> \brief creates the interpolation section for the periodic QM/MM
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_gspace_interp_section(section,error)
+ SUBROUTINE create_gspace_interp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gspace_interp_section', &
routineP = moduleN//':'//routineN
@@ -5057,11 +4776,10 @@ SUBROUTINE create_gspace_interp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="interpolator",&
description="controls the interpolation for the G-space term",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, print_key)
@@ -5073,10 +4791,9 @@ SUBROUTINE create_gspace_interp_section(section,error)
enum_c_vals=s2a( "copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="precond",&
description="The preconditioner used"//&
@@ -5086,29 +4803,28 @@ SUBROUTINE create_gspace_interp_section(section,error)
enum_c_vals=s2a("copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_x",&
description="accuracy on the solution for spline3 the interpolators",&
- usage="eps_x 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_x 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_r",&
description="accuracy on the residual for spline3 the interpolators",&
- usage="eps_r 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_r 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="max_iter",&
variants=(/'maxiter'/),&
description="the maximum number of iterations",&
- usage="max_iter 200", default_i_val=100, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="max_iter 200", default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"conv_info",&
@@ -5116,9 +4832,9 @@ SUBROUTINE create_gspace_interp_section(section,error)
" of the spline methods should be printed", &
print_level=medium_print_level,each_iter_names=s2a("SPLINE_FIND_COEFFS"),&
each_iter_values=(/10/),filename="__STD_OUT__",&
- add_last=add_last_numeric,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_gspace_interp_section
@@ -5126,13 +4842,10 @@ END SUBROUTINE create_gspace_interp_section
!> \brief input section for optional parameters for LRIGPW
!> LRI: local resolution of identity
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze [02.2015]
! *****************************************************************************
- SUBROUTINE create_lrigpw_section(section,error)
+ SUBROUTINE create_lrigpw_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_lrigpw_section', &
routineP = moduleN//':'//routineN
@@ -5142,11 +4855,10 @@ SUBROUTINE create_lrigpw_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="LRIGPW",&
description="This section specifies optional parameters for LRIGPW.",&
- n_keywords=3, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -5171,47 +4883,43 @@ SUBROUTINE create_lrigpw_section(section,error)
"Calculating the pseudoinverse is much more expensive."),&
enum_i_vals=(/do_lri_inv, do_lri_pseudoinv_svd,&
do_lri_pseudoinv_diag, do_lri_inv_auto/),&
- default_i_val=do_lri_inv,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_lri_inv)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_CONDITION_NUM", &
description="If AUTOSELECT is chosen for LRI_OVERLAP_MATRIX, this "//&
"keyword specifies that the pseudoinverse is calculated "//&
"only if the LOG of the condition number of the lri "//&
"overlap matrix is larger than the given value.",&
- usage="MAX_CONDITION_NUM 20.0", default_r_val=20.0_dp,&
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="MAX_CONDITION_NUM 20.0", default_r_val=20.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DEBUG_LRI_INTEGRALS",&
description="Debug the integrals needed for LRIGPW.",&
usage="DEBUG_LRI_INTEGRALS TRUE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHG_LRI_INTEGRALS",&
description="Uses the SHG (solid harmonic Gaussian) integral "//&
"scheme instead of Obara-Saika",&
usage="SHG_LRI_INTEGRALS TRUE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_lrigpw_section
! *****************************************************************************
!> \brief input section for optimization of the auxililary basis for LRIGPW
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze [05.2014]
! *****************************************************************************
- SUBROUTINE create_optimize_lri_basis_section(section,error)
+ SUBROUTINE create_optimize_lri_basis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_optimize_lri_basis_section', &
@@ -5223,60 +4931,55 @@ SUBROUTINE create_optimize_lri_basis_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="OPTIMIZE_LRI_BASIS",&
description="This section specifies the parameters for optimizing "//&
"the lri auxiliary basis sets for LRIGPW. The Powell optimizer is used.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword,subsection)
CALL keyword_create(keyword, name="ACCURACY", &
description="Target accuracy for the objective function (RHOEND)",&
- usage="ACCURACY 5.0E-4", default_r_val=1.0E-5_dp,&
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="ACCURACY 5.0E-4", default_r_val=1.0E-5_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_FUN", &
description="Maximum number of function evaluations",&
- usage="MAX_FUN 200", default_i_val=4000,&
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="MAX_FUN 200", default_i_val=4000)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEP_SIZE", &
description="Initial step size for search algorithm (RHOBEG)",&
- usage="STEP_SIZE 1.0E-1", default_r_val=5.0E-2_dp,&
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="STEP_SIZE 1.0E-1", default_r_val=5.0E-2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CONDITION_WEIGHT", &
description="This keyword allows to give different weight "//&
"factors to the condition number (LOG(cond) is used).",&
- usage="CONDITION_WEIGHT 1.0E-4", default_r_val=1.0E-6_dp,&
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="CONDITION_WEIGHT 1.0E-4", default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="USE_CONDITION_NUMBER",&
description="Determines whether condition number should be part "//&
"of optimization or not",&
usage="USE_CONDITION_NUMBER",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GEOMETRIC_SEQUENCE",&
description="Exponents are assumed to be a geometric squence. "//&
"Only the minimal and maximal exponents of one set are optimized and "//&
"the other exponents are obtained by geometric progression.",&
usage="GEOMETRIC_SEQUENCE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DEGREES_OF_FREEDOM",&
description="Specifies the degrees of freedom in the basis "//&
@@ -5287,26 +4990,23 @@ SUBROUTINE create_optimize_lri_basis_section(section,error)
"Set all coefficients in the basis set to be variable.",&
"Set all exponents in the basis to be variable."),&
enum_i_vals=(/do_lri_opt_all, do_lri_opt_coeff, do_lri_opt_exps/),&
- default_i_val=do_lri_opt_exps,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_lri_opt_exps)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_constrain_exponents_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_constrain_exponents_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_optimize_lri_basis_section
! *****************************************************************************
!> \brief input section for constraints for auxiliary basis set optimization
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze [11.2014]
! *****************************************************************************
- SUBROUTINE create_constrain_exponents_section(section,error)
+ SUBROUTINE create_constrain_exponents_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_constrain_exponents_section', &
@@ -5320,8 +5020,7 @@ SUBROUTINE create_constrain_exponents_section(section,error)
CALL section_create(section,name="CONSTRAIN_EXPONENTS",&
description="specifies constraints for the exponents of the "//&
"lri auxiliary basis sets in the optimization.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -5329,15 +5028,15 @@ SUBROUTINE create_constrain_exponents_section(section,error)
description="Defines the upper and lower boundaries as "//&
"(1+scale)*exp and (1-scale)*exp. Fermi-like constraint "//&
"function",&
- usage="SCALE 0.3", default_r_val=0.3_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALE 0.3", default_r_val=0.3_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FERMI_EXP",&
description="Exponent in the fermi-like constraint function. ",&
- usage="FERMI_EXP 2.63", default_r_val=2.63391_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FERMI_EXP 2.63", default_r_val=2.63391_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_constrain_exponents_section
@@ -5345,13 +5044,10 @@ END SUBROUTINE create_constrain_exponents_section
! *****************************************************************************
!> \brief creates the multigrid
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_mgrid_section(section,error)
+ SUBROUTINE create_mgrid_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mgrid_section', &
routineP = moduleN//':'//routineN
@@ -5362,47 +5058,46 @@ SUBROUTINE create_mgrid_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="mgrid",&
description="multigrid information",&
- n_keywords=5, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="NGRIDS",&
description="The number of multigrids to use",&
- usage="ngrids 1", default_i_val=4, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ngrids 1", default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="cutoff",&
description="The cutoff of the finest grid level. Default value for "//&
"SE or DFTB calculation is 1.0 [Ry].",&
usage="cutoff 300",default_r_val=cp_unit_to_cp2k(value=280.0_dp,&
- unit_str="Ry",error=error), n_var=1, unit_str="Ry", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="Ry"), n_var=1, unit_str="Ry")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="progression_factor",&
description="Factor used to find the cutoff of the multigrids that"//&
" where not given explicitly",&
- usage="progression_factor ", default_r_val=3._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="progression_factor ", default_r_val=3._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="commensurate",&
description="If the grids should be commensurate. If true overrides "//&
"the progression factor and the cutoffs of the sub grids",&
usage="commensurate", default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="realspace",&
description="If both rho and rho_gspace are needed ",&
usage="realspace", default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REL_CUTOFF",&
variants=(/"RELATIVE_CUTOFF"/),&
@@ -5412,54 +5107,48 @@ SUBROUTINE create_mgrid_section(section,error)
" Or for simulations with a variable cell."//&
" Versions prior to 2.3 used a default of 30Ry.",&
usage="RELATIVE_CUTOFF real", default_r_val=20.0_dp,&
- unit_str="Ry",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="Ry")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MULTIGRID_SET",&
description="Activate a manual setting of the multigrids",&
- usage="MULTIGRID_SET", default_l_val=.FALSE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MULTIGRID_SET", default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SKIP_LOAD_BALANCE_DISTRIBUTED",&
description="Skip load balancing on distributed multigrids, which might be memory intensive."//&
"If not explicitly specified, runs using more than 1024 MPI tasks will default to .TRUE.",&
- usage="SKIP_LOAD_BALANCE_DISTRIBUTED", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., &
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SKIP_LOAD_BALANCE_DISTRIBUTED", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="MULTIGRID_CUTOFF",&
variants=(/"CUTOFF_LIST"/),&
description="List of cutoff values to set up multigrids manually",&
- usage="MULTIGRID_CUTOFF 200.0 100.0 ", n_var=-1, type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MULTIGRID_CUTOFF 200.0 100.0 ", n_var=-1, type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_rsgrid_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rsgrid_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_mgrid_section
! *****************************************************************************
!> \brief creates the interpolation section
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_interp_section(section,error)
+ SUBROUTINE create_interp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_interp_section', &
routineP = moduleN//':'//routineN
@@ -5470,11 +5159,10 @@ SUBROUTINE create_interp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="interpolator",&
description="kind of interpolation used between the multigrids",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, print_key)
@@ -5484,18 +5172,17 @@ SUBROUTINE create_interp_section(section,error)
default_i_val=pw_interp,&
enum_c_vals=s2a("pw","spline3_nopbc","spline3"),&
enum_i_vals=(/pw_interp,&
- spline3_nopbc_interp,spline3_pbc_interp/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ spline3_nopbc_interp,spline3_pbc_interp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="safe_computation",&
description="if a non unrolled calculation is to be performed in parallel",&
usage="safe_computation OFF",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="aint_precond",&
description="the approximate inverse to use to get the starting point"//&
@@ -5505,10 +5192,9 @@ SUBROUTINE create_interp_section(section,error)
enum_c_vals=s2a( "copy","spl3_nopbc_aint1","spl3_nopbc_aint2",&
"spl3_nopbc_precond1","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_aint2,&
- precond_spl3_1,precond_spl3_2,precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_1,precond_spl3_2,precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="precond",&
description="The preconditioner used"//&
@@ -5518,29 +5204,28 @@ SUBROUTINE create_interp_section(section,error)
enum_c_vals=s2a( "copy","spl3_nopbc_aint1","spl3_nopbc_aint2",&
"spl3_nopbc_precond1","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_aint2,&
- precond_spl3_1,precond_spl3_2,precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_1,precond_spl3_2,precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_x",&
description="accuracy on the solution for spline3 the interpolators",&
- usage="eps_x 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_x 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_r",&
description="accuracy on the residual for spline3 the interpolators",&
- usage="eps_r 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_r 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="max_iter",&
variants=(/'maxiter'/),&
description="the maximum number of iterations",&
- usage="max_iter 200", default_i_val=100, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="max_iter 200", default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"conv_info",&
@@ -5548,22 +5233,19 @@ SUBROUTINE create_interp_section(section,error)
" of the spline methods should be printed", &
print_level=medium_print_level,each_iter_names=s2a("SPLINE_FIND_COEFFS"),&
each_iter_values=(/10/),filename="__STD_OUT__",&
- add_last=add_last_numeric,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_interp_section
! *****************************************************************************
!> \brief creates the sic (self interaction correction) section
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_sic_section(section,error)
+ SUBROUTINE create_sic_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_sic_section', &
routineP = moduleN//':'//routineN
@@ -5573,12 +5255,11 @@ SUBROUTINE create_sic_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"sic",&
description="parameters for the self interaction correction",&
n_keywords=6, n_subsections=0, repeats=.FALSE., &
- citations=(/VandeVondele2005b,Perdew1981,Avezac2005/),&
- error=error)
+ citations=(/VandeVondele2005b,Perdew1981,Avezac2005/))
NULLIFY(keyword)
@@ -5586,17 +5267,17 @@ SUBROUTINE create_sic_section(section,error)
description="Scaling of the coulomb term in sic [experimental]",&
usage="SIC_SCALING_A 0.5",&
citations=(/VandeVondele2005b/),&
- default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIC_SCALING_B",&
description="Scaling of the xc term in sic [experimental]",&
usage="SIC_SCALING_B 0.5",&
citations=(/VandeVondele2005b/),&
- default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIC_METHOD",&
description="Method used to remove the self interaction",&
@@ -5611,10 +5292,9 @@ SUBROUTINE create_sic_section(section,error)
" on the spin density / doublet unpaired orbital",&
"The average density correction",&
"(scaled) Perdew-Zunger correction explicitly on a set of orbitals."),&
- citations=(/VandeVondele2005b,Perdew1981,Avezac2005/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/VandeVondele2005b,Perdew1981,Avezac2005/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORBITAL_SET",&
description="Type of orbitals treated with the SIC",&
@@ -5623,22 +5303,19 @@ SUBROUTINE create_sic_section(section,error)
enum_c_vals=s2a("UNPAIRED","ALL"),&
enum_desc=s2a("correction for the unpaired orbitals only, requires a restricted open shell calculation",&
"correction for all orbitals, requires a LSD or ROKS calculation"),&
- enum_i_vals=(/sic_list_unpaired,sic_list_all/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/sic_list_unpaired,sic_list_all/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_sic_section
! *****************************************************************************
!> \brief creates the low spin roks section
!> \param section ...
-!> \param error ...
!> \author Joost VandeVondele
! *****************************************************************************
- SUBROUTINE create_low_spin_roks_section(section,error)
+ SUBROUTINE create_low_spin_roks_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_low_spin_roks_section', &
routineP = moduleN//':'//routineN
@@ -5648,42 +5325,39 @@ SUBROUTINE create_low_spin_roks_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"LOW_SPIN_ROKS",&
description="Specify the details of the low spin ROKS method."//&
"In particular, one can specify various terms added to the energy of the high spin roks configuration"//&
" with a energy scaling factor, and a prescription of the spin state.",&
- n_keywords=6, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=6, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword,name="ENERGY_SCALING",&
description="The scaling factors for each term added to the total energy."//&
"This list should contain one number for each term added to the total energy.",&
usage="ENERGY_SCALING 1.0 -1.0 ",&
- n_var=-1,type_of_var=real_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SPIN_CONFIGURATION",&
description="for each singly occupied orbital, specify if this should be an alpha (=1) or a beta (=2) orbital"//&
"This keyword should be repeated, each repetition corresponding to an additional term." ,&
usage="SPIN_CONFIGURATION 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_low_spin_roks_section
! *****************************************************************************
!> \brief Creates the section for applying an electrostatic external potential
!> \param section ...
-!> \param error ...
!> \date 12.2009
!> \author teo
! *****************************************************************************
- SUBROUTINE create_ext_pot_section(section,error)
+ SUBROUTINE create_ext_pot_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ext_pot_section', &
routineP = moduleN//':'//routineN
@@ -5693,93 +5367,90 @@ SUBROUTINE create_ext_pot_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXTERNAL_POTENTIAL",&
description="Section controlling the presence of an electrostatic "//&
"external potential dependent on the atomic positions (X,Y,Z). "//&
"As the external potential is currently applied via a grid, "//&
"it only works with DFT based methods (GPW/GAPW) that already use "//&
"a grid based approach to solve the Poisson equation.",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="FUNCTION",&
description="Specifies the functional form in mathematical notation. Variables must be the atomic "//&
"coordinates (X,Y,Z) of the grid.",usage="FUNCTION X^2+Y^2+Z^2+LOG(ABS(X+Y))", &
- type_of_var=lchar_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNITS",&
description="Optionally, allows to define valid CP2K unit strings for each parameter value. "//&
"It is assumed that the corresponding parameter value is specified in this unit.",&
usage="UNITS angstrom eV*angstrom^-1 angstrom^1 K", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STATIC",&
description="Specifies the external potential as STATIC or time dependent. At the moment "//&
"only static potentials are implemented.",&
- usage="STATIC T", default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STATIC T", default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DX",&
description="Parameter used for computing the derivative with the Ridders' method.",&
- usage="DX ", default_r_val=0.1_dp, unit_str="bohr", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=0.1_dp, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERROR_LIMIT",&
description="Checks that the error in computing the derivative is not larger than "//&
"the value set; in case error is larger a warning message is printed.",&
- usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!keyword for reading the external potential from cube file
CALL keyword_create(keyword, name="READ_FROM_CUBE",&
description="Switch for reading the external potential from file pot.cube. The values "//&
"of the potential must be on the grid points of the realspace grid.",&
- usage="READ_FROM_CUBE T", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="READ_FROM_CUBE T", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!keyword for scaling the external potential that is read from file by a constant factor
CALL keyword_create(keyword, name="SCALING_FACTOR",&
description="A factor for scaling the the external potential that is read from file."//&
"The value of the potential at each grid point is multiplied by this factor.",&
- usage="SCALING_FACTOR ", default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALING_FACTOR ", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ext_pot_section
! *****************************************************************************
!> \brief ZMP Creates the section for reading user supplied external density
!> \param section ...
-!> \param error ...
!> \date 03.2011
!> \author D. Varsano [daniele.varsano@nano.cnr.it]
! *****************************************************************************
- SUBROUTINE create_ext_den_section(section,error)
+ SUBROUTINE create_ext_den_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ext_den_section', &
routineP = moduleN//':'//routineN
@@ -5789,12 +5460,11 @@ SUBROUTINE create_ext_den_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXTERNAL_DENSITY",&
description="Section for the use of the ZMP technique on external densities.",&
n_keywords=4, n_subsections=0, repeats=.FALSE., &
- citations=(/Zhao1994, Tozer1996/),&
- error=error)
+ citations=(/Zhao1994, Tozer1996/))
NULLIFY(keyword)
CALL keyword_create(keyword, name="FILE_DENSITY",&
@@ -5804,9 +5474,9 @@ SUBROUTINE create_ext_den_section(section,error)
"be previously defined choosing the plane waves cut-off in section MGRID"//&
"keyword CUTOFF, and the cube dimention in section SUBSYS / CELL / keyword ABC",&
usage="DENSITY_FILE_NAME ",&
- type_of_var=char_t,default_c_val="RHO_O.dat", n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t,default_c_val="RHO_O.dat", n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
description="Lagrange multiplier defined in the constraint ZMP method. When starting, use"//&
@@ -5814,9 +5484,9 @@ SUBROUTINE create_ext_den_section(section,error)
"the values depending, restarting from the previous calculation with the smaller"//&
"value. To choose the progressive values of LAMBDA look at the convergence of the"//&
" eigenvalues.",&
- usage="DX ", default_r_val=10.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=10.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ZMP_CONSTRAINT",&
description="Specify which kind of constraint to solve the ZMP equation. The COULOMB default"//&
@@ -5827,9 +5497,9 @@ SUBROUTINE create_ext_den_section(section,error)
enum_desc=s2a("Coulomb constraint, integral of [rho_0(r)-rho(r)]/|r-r'|",&
"Simple constraint, [rho_0(r)-rho(r)]",&
"No constrain imposed"),&
- default_i_val=use_coulomb, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=use_coulomb)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FERMI_AMALDI",&
description="Add the Fermi-Amaldi contribution to the Hartree potential."//&
@@ -5837,22 +5507,20 @@ SUBROUTINE create_ext_den_section(section,error)
usage="FERMI_AMALDI ",&
repeats=.FALSE.,&
n_var=1,&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ext_den_section
! *****************************************************************************
!> \brief ZMP Creates the section for creating the external v_xc
!> \param section ...
-!> \param error ...
!> \date 03.2011
!> \author D. Varsano [daniele.varsano@nano.cnr.it]
! *****************************************************************************
- SUBROUTINE create_ext_vxc_section(section,error)
+ SUBROUTINE create_ext_vxc_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ext_vxc_section', &
routineP = moduleN//':'//routineN
@@ -5862,12 +5530,11 @@ SUBROUTINE create_ext_vxc_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXTERNAL_VXC",&
description="SCF convergence with external v_xc calculated through previous ZMP"//&
"calculation",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="FILE_VXC",&
@@ -5878,22 +5545,19 @@ SUBROUTINE create_ext_vxc_section(section,error)
"respectively set in section MGRID / keyword CUTOFF, and in section SUBSYS /"//&
"CELL / keyword ABC",&
usage="FILE_VXC ",&
- type_of_var=char_t,default_c_val="VXC_O.dat", n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=char_t,default_c_val="VXC_O.dat", n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ext_vxc_section
! *****************************************************************************
!> \brief creates the section for static periodic fields
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Florian Schiffmann
! *****************************************************************************
- SUBROUTINE create_per_efield_section(section,error)
+ SUBROUTINE create_per_efield_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_per_efield_section', &
routineP = moduleN//':'//routineN
@@ -5903,54 +5567,49 @@ SUBROUTINE create_per_efield_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"PERIODIC_EFIELD",&
description="parameters for finite periodic electric field computed using "//&
"the Berry phase approach. IMPORTANT: Can only be used in combination "//&
" with OT. Can not be used in combination with RTP or EMD.",&
citations=(/Souza2002, Umari2002/),&
- n_keywords=6, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="INTENSITY",&
description="Intensity of the electric field in a.u",&
usage="INTENSITY 0.001",&
- default_r_val=0._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POLARISATION",&
description="Polarisation vector of electric field",&
usage="POLARISIATION 0.0 0.0 1.0",&
repeats=.FALSE.,n_var=3,&
- type_of_var=real_t,default_r_vals=(/0.0_dp,0.0_dp,1.0_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_vals=(/0.0_dp,0.0_dp,1.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISPLACEMENT_FIELD",&
description="Use the displacement field formulation.",&
usage="DISPLACEMENT_FIELD T",&
citations=(/Stengel2009/),&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_per_efield_section
! *****************************************************************************
!> \brief creates the section for time dependent nonperiodic fields
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Florian Schiffmann
! *****************************************************************************
- SUBROUTINE create_efield_section(section,error)
+ SUBROUTINE create_efield_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_efield_section', &
routineP = moduleN//':'//routineN
@@ -5961,11 +5620,10 @@ SUBROUTINE create_efield_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"EFIELD",&
description="parameters for finite, time dependent, nonperiodic electric fields",&
- n_keywords=6, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword,subsection)
@@ -5975,33 +5633,32 @@ SUBROUTINE create_efield_section(section,error)
"to a maximal amplitude in a.u. of sqrt(I/(3.50944*10^16)). "//&
"For a constant local field in isolated system calclulations, units are in a.u..",&
usage="INTENSITY 0.001",&
- default_r_val=0._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POLARISATION",&
description="Polarisation vector of electric field",&
usage="POLARISATION 0.0 0.0 1.0",&
repeats=.FALSE.,n_var=3,&
- type_of_var=real_t,default_r_vals=(/0.0_dp,0.0_dp,1.0_dp/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_vals=(/0.0_dp,0.0_dp,1.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WAVELENGTH",&
description="Wavelength of efield field for real-time propagation (RTP) calculations.",&
usage="Wavelength 1.E0",&
- default_r_val=0._dp,unit_str="nm",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp,unit_str="nm")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PHASE",&
description="Phase offset of the cosine given in multiples of pi. "//&
"Used in real-time propagation (RTP) calculations.",&
usage="Phase 1.E0",&
- default_r_val=0._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENVELOP",&
description="Shape of the efield pulse used in real-time propagation (RTP) calculations.",&
@@ -6011,35 +5668,32 @@ SUBROUTINE create_efield_section(section,error)
enum_desc=s2a("No envelop function is applied to the strength",&
"A Gaussian function is used as envelop ",&
"Linear tune in/out of the field"),&
- enum_i_vals=(/constant_env,gaussian_env,ramp_env/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/constant_env,gaussian_env,ramp_env/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_constant_env_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_constant_env_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_ramp_env_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ramp_env_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_gaussian_env_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gaussian_env_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_efield_section
! *****************************************************************************
!> \brief makes the orbital transformation section
!> \param section ...
-!> \param error ...
!> \par History
!> 11.2004 created [Joost VandeVondele]
! *****************************************************************************
- SUBROUTINE create_ot_section(section,error)
+ SUBROUTINE create_ot_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ot_section', &
routineP = moduleN//':'//routineN
@@ -6049,7 +5703,7 @@ SUBROUTINE create_ot_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"OT",&
description="Sets the various options for the orbital transformation (OT) method. "//&
"Default settings already provide an efficient, yet robust method. "//&
@@ -6057,7 +5711,7 @@ SUBROUTINE create_ot_section(section,error)
"combined with a small value (0.001) of ENERGY_GAP."//&
"Well-behaved systems might benefit from using a DIIS minimizer.",&
n_keywords=27, n_subsections=0, repeats=.FALSE., &
- citations=(/VandeVondele2003,Weber2008/), error=error)
+ citations=(/VandeVondele2003,Weber2008/))
NULLIFY(keyword)
@@ -6065,10 +5719,9 @@ SUBROUTINE create_ot_section(section,error)
description="controls the activation of the ot method",&
usage="&OT T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALGORITHM",&
description="Algorithm to be used for OT",&
@@ -6079,24 +5732,23 @@ SUBROUTINE create_ot_section(section,error)
"Orbital Transformation based Iterative Refinement "//&
"of the Approximative Congruence transformation (OT/IR)."),&
enum_i_vals=(/ot_algo_taylor_or_diag,ot_algo_irac/),&
- citations=(/VandeVondele2003,VandeVondele2005a,Weber2008/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/VandeVondele2003,VandeVondele2005a,Weber2008/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="IRAC_DEGREE",&
description="The refinement polynomial degree (2, 3 or 4).",&
usage="IRAC_DEGREE 4",&
- default_i_val=4,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_IRAC",&
description="Maximum allowed refinement iteration.",&
usage="MAX_IRAC 5",&
- default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIXED_PRECISION",&
description="Uses a mixed precision algorithm." //&
@@ -6104,9 +5756,9 @@ SUBROUTINE create_ot_section(section,error)
"it provides double precision accuracy results and up to a 2 fold speedup for building and "//&
"applying the preconditioner.",&
usage="MIXED_PRECISION T",&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORTHO_IRAC",&
description="The orthogonality method.",&
@@ -6114,48 +5766,47 @@ SUBROUTINE create_ot_section(section,error)
default_i_val=ot_chol_irac,&
enum_c_vals=s2a( "CHOL", "POLY", "LWDN"),&
enum_desc=s2a("Cholesky.","Polynomial.","Loewdin."),&
- enum_i_vals=(/ot_chol_irac,ot_poly_irac,ot_lwdn_irac/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ot_chol_irac,ot_poly_irac,ot_lwdn_irac/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_IRAC_FILTER_MATRIX",&
description="Sets the threshold for filtering the matrices.",&
usage="EPS_IRAC_FILTER_MATRIX 1.0E-5",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_IRAC",&
description="Targeted accuracy during the refinement iteration.",&
usage="EPS_IRAC 1.0E-5",&
- default_r_val=1.0E-10_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_IRAC_QUICK_EXIT",&
description="Only one extra refinement iteration is "//&
"done when the norm is below this value.",&
usage="EPS_IRAC_QUICK_EXIT 1.0E-2",&
- default_r_val=1.0E-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_IRAC_SWITCH",&
description="The algorithm switches to the polynomial "//&
"refinement when the norm is below this value.",&
usage="EPS_IRAC_SWITCH 1.0E-3",&
- default_r_val=1.0E-2_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ON_THE_FLY_LOC",&
description="On the fly localization of the molecular orbitals. "//&
"Can only be used with OT/IRAC.",&
usage="ON_THE_FLY_LOC T",&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MINIMIZER",&
description="Minimizer to be used with the OT method",&
@@ -6166,96 +5817,95 @@ SUBROUTINE create_ot_section(section,error)
" The total energy should decrease at every OT CG step if the line search is appropriate.", &
"Direct inversion in the iterative subspace: less reliable than CG, but sometimes about 50% faster",&
"Broyden mixing approximating the inverse Hessian"),&
- enum_i_vals=(/ot_mini_sd,ot_mini_cg,ot_mini_diis,ot_mini_broyden/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ot_mini_sd,ot_mini_cg,ot_mini_diis,ot_mini_broyden/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SAFE_DIIS",&
variants=(/"SAFER_DIIS"/),&
description="Reject DIIS steps if they point away from the"//&
" minimum, do SD in that case.",&
- usage="SAFE_DIIS ON", default_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SAFE_DIIS ON", default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_HISTORY_VEC",&
variants=s2a("NDIIS","N_DIIS","N_BROYDEN"),&
description="Number of history vectors to be used with DIIS or BROYDEN",&
usage="N_DIIS 4",&
- default_i_val=7,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=7)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_BETA",&
description="Underrelaxation for the broyden mixer",&
usage="BROYDEN_BETA 0.9",&
- default_r_val=0.9_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.9_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_GAMMA",&
description="Backtracking parameter",&
usage="BROYDEN_GAMMA 0.5",&
- default_r_val=0.5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_SIGMA",&
description="Curvature of energy functional.",&
usage="BROYDEN_SIGMA 0.25",&
- default_r_val=0.25_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.25_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_ETA",&
description="Dampening of estimated energy curvature.",&
usage="BROYDEN_ETA 0.7",&
- default_r_val=0.7_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_OMEGA",&
description="Growth limit of curvature.",&
usage="BROYDEN_OMEGA 1.1",&
- default_r_val=1.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_SIGMA_DECREASE",&
description="Reduction of curvature on bad approximation.",&
usage="BROYDEN_SIGMA_DECREASE 0.7",&
- default_r_val=0.7_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_SIGMA_MIN",&
description="Minimum adaptive curvature.",&
usage="BROYDEN_SIGMA_MIN 0.05",&
- default_r_val=0.05_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.05_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_FORGET_HISTORY",&
description="Forget history on bad approximation", &
usage="BROYDEN_FORGET_HISTORY OFF", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_ADAPTIVE_SIGMA",&
description="Enable adaptive curvature estimation", &
usage="BROYDEN_ADAPTIVE_SIGMA ON", default_l_val=.TRUE., &
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BROYDEN_ENABLE_FLIP",&
description="Ensure positive definite update", &
usage="BROYDEN_ENABLE_FLIP ON", default_l_val=.TRUE., &
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LINESEARCH",&
variants=(/"LINE_SEARCH"/),&
@@ -6269,10 +5919,9 @@ SUBROUTINE create_ot_section(section,error)
enum_c_vals=s2a( "NONE", "2PNT", "3PNT","GOLD"),&
enum_desc=s2a("take fixed lenght steps","extrapolate based on 2 points", &
"... or on 3 points","perform 1D golden section search of the minimum (very expensive)"),&
- enum_i_vals=(/ls_none,ls_2pnt,ls_3pnt,ls_gold/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_none,ls_2pnt,ls_3pnt,ls_gold/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEPSIZE",&
description="Initial stepsize used for the line search, sometimes this parameter can be reduced to stablize DIIS"//&
@@ -6280,16 +5929,16 @@ SUBROUTINE create_ot_section(section,error)
" The optimal value depends on the quality of the preconditioner."//&
" A negative values leaves the choice to CP2K depending on the preconditioner.",&
usage="STEPSIZE 0.4",&
- default_r_val=-1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GOLD_TARGET",&
description="Target relative uncertainty in the location of the minimum for LINESEARCH GOLD",&
usage="GOLD_TARGET 0.1",&
- default_r_val=0.01_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.01_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECONDITIONER",&
description="Type of preconditioner to be used with all minimization schemes. "//&
@@ -6313,10 +5962,9 @@ SUBROUTINE create_ot_section(section,error)
"skip preconditioning"),&
enum_i_vals=(/ot_precond_full_all,ot_precond_full_single_inverse,ot_precond_full_single, &
ot_precond_full_kinetic,ot_precond_s_inverse,ot_precond_none/),&
- citations=(/VandeVondele2003/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/VandeVondele2003/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECOND_SOLVER",&
description="How the preconditioner is applied to the residual.",&
@@ -6332,10 +5980,9 @@ SUBROUTINE create_ot_section(section,error)
enum_i_vals=(/ot_precond_solver_default,&
ot_precond_solver_direct,&
ot_precond_solver_inv_chol,&
- ot_precond_solver_update/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ ot_precond_solver_update/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENERGY_GAP",&
description="Should be an estimate for the energy gap [a.u.] (HOMO-LUMO) and is used in preconditioning, "//&
@@ -6345,25 +5992,25 @@ SUBROUTINE create_ot_section(section,error)
" In general, heigher values will tame the preconditioner in case of poor initial guesses."//&
" A negative value will leave the choice to CP2K depending on type of preconditioner.",&
usage="ENERGY_GAP 0.001",&
- default_r_val=-1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_TAYLOR",&
variants=(/"EPSTAYLOR"/),&
description="Target accuracy of the taylor expansion for the matrix functions, should normally be kept as is.",&
usage="EPS_TAYLOR 1.0E-15",&
- default_r_val=1.0E-16_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-16_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_TAYLOR",&
description="Maximum order of the Taylor expansion before diagonalisation is prefered, for large parallel runs"//&
" a slightly higher order could sometimes result in a small speedup.",&
usage="MAX_TAYLOR 5",&
- default_i_val=4,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROTATION",&
description="Introduce additional variables so that rotations of the occupied"//&
@@ -6371,37 +6018,37 @@ SUBROUTINE create_ot_section(section,error)
" a rotation of the occupied subspace such as non-singlet restricted calculations "//&
" or fractional occupations.",&
usage="ROTATION",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENERGIES",&
description="Optimize orbital energies for use in Fermi-Dirac smearing "//&
"(requires ROTATION and FD smearing to be active).",&
usage="ENERGIES",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OCCUPATION_PRECONDITIONER",&
description="Preconditioner with the occupation numbers (FD smearing)",&
usage="OCCUPATION_PRECONDITIONER",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NONDIAG_ENERGY",&
description="Add a non-diagonal energy penalty (FD smearing)",&
usage="NONDIAG_ENERGY",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NONDIAG_ENERGY_STRENGTH",&
description="The prefactor for the non-diagonal energy penalty (FD smearing)",&
- usage="NONDIAG_ENERGY_STRENGTH", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NONDIAG_ENERGY_STRENGTH", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ot_section
@@ -6409,13 +6056,11 @@ END SUBROUTINE create_ot_section
! *****************************************************************************
!> \brief creates the diagonalization section
!> \param section ...
-!> \param error ...
!> \par History
!> 10.2008 created [JGH]
! *****************************************************************************
- SUBROUTINE create_diagonalization_section(section,error)
+ SUBROUTINE create_diagonalization_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_diagonalization_section', &
@@ -6427,11 +6072,10 @@ SUBROUTINE create_diagonalization_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DIAGONALIZATION",&
description="Set up type and parameters for Kohn-Sham matrix diagonalization.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword)
@@ -6439,10 +6083,9 @@ SUBROUTINE create_diagonalization_section(section,error)
description="controls the activation of the diagonalization method",&
usage="&DIAGONALIZATION T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALGORITHM",&
description="Algorithm to be used for diagonalization",&
@@ -6455,19 +6098,17 @@ SUBROUTINE create_diagonalization_section(section,error)
"Preconditioned blocked Davidson",&
"Filter matrix diagonalization"),&
enum_i_vals=(/diag_standard, diag_ot, diag_block_krylov, diag_block_davidson,&
- diag_filter_matrix/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ diag_filter_matrix/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="JACOBI_THRESHOLD",&
description="Controls the accuracy of the pseudo-diagonalization method using Jacobi rotations",&
usage="JACOBI_THRESHOLD 1.0E-6",&
default_r_val=1.0E-7_dp,&
- citations=(/Stewart1982/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/Stewart1982/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_JACOBI",&
description="Below this threshold value for the SCF convergence the pseudo-diagonalization "//&
@@ -6479,61 +6120,57 @@ SUBROUTINE create_diagonalization_section(section,error)
"up calculations for large systems e.g. using a semi-empirical method.",&
usage="EPS_JACOBI 1.0E-5",&
default_r_val=0.0_dp,&
- citations=(/Stewart1982/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/Stewart1982/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ADAPT",&
description="Required accuracy in iterative diagonalization as compared to current SCF convergence",&
usage="EPS_ADAPT 0.01",&
- default_r_val=0._dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of iterations in iterative diagonalization",&
usage="MAX_ITER 20",&
- default_i_val=2,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ITER",&
description="Required accuracy in iterative diagonalization",&
usage="EPS_ITER 1.e-8",&
- default_r_val=1.e-8_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.e-8_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_ot_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ot_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_krylov_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_krylov_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_diag_subspace_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_diag_subspace_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_davidson_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_davidson_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_filtermatrix_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_filtermatrix_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_diagonalization_section
@@ -6542,12 +6179,10 @@ END SUBROUTINE create_diagonalization_section
! *****************************************************************************
!> \brief Input section for filter matrix diagonalisation method
!> \param section : section to be created
-!> \param error : cp2k error container
!> \author Lianheng Tong (LT) lianheng.tong@kcl.ac.uk
! *****************************************************************************
- SUBROUTINE create_filtermatrix_section(section, error)
+ SUBROUTINE create_filtermatrix_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_filtermatrix_section', &
routineP = moduleN//':'//routineN
@@ -6556,12 +6191,11 @@ SUBROUTINE create_filtermatrix_section(section, error)
TYPE(keyword_type), POINTER :: keyword
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"FILTER_MATRIX",&
description=" ",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -6573,14 +6207,12 @@ SUBROUTINE create_filtermatrix_section(section, error)
n_var=1, &
type_of_var=real_t, &
default_r_val=cp_unit_to_cp2k(value=30000.0_dp, &
- unit_str="K", &
- error=error), &
+ unit_str="K"),&
unit_str="K", &
usage="FILTER_TEMPERATURE [K] 30000", &
- citations=(/Rayson2009/), &
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ citations=(/Rayson2009/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, &
name="AUTO_CUTOFF_SCALE", &
@@ -6592,10 +6224,9 @@ SUBROUTINE create_filtermatrix_section(section, error)
type_of_var=real_t, &
default_r_val=1.0_dp, &
usage="AUTO_CUTOFF_SCALE 0.5_dp", &
- citations=(/Rayson2009/), &
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ citations=(/Rayson2009/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, &
name="COLLECTIVE_COMMUNICATION", &
@@ -6612,10 +6243,9 @@ SUBROUTINE create_filtermatrix_section(section, error)
n_var=1, &
type_of_var=logical_t, &
default_l_val=.FALSE., &
- usage="COLLECTIVE_COMMUNICATION T", &
- error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="COLLECTIVE_COMMUNICATION T")
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_filtermatrix_section
@@ -6623,11 +6253,9 @@ END SUBROUTINE create_filtermatrix_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_davidson_section(section,error)
+ SUBROUTINE create_davidson_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_davidson_section', &
routineP = moduleN//':'//routineN
@@ -6636,11 +6264,10 @@ SUBROUTINE create_davidson_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DAVIDSON",&
description=" ",&
- n_keywords=2, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -6654,10 +6281,9 @@ SUBROUTINE create_davidson_section(section,error)
"but cheaper to construct, might be somewhat less robust. Recommended for large systems.",&
"skip preconditioning"),&
enum_i_vals=(/ot_precond_full_all,ot_precond_full_single_inverse,ot_precond_none/),&
- citations=(/VandeVondele2003/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/VandeVondele2003/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECOND_SOLVER",&
description="How the preconditioner is applied to the residual.",&
@@ -6670,10 +6296,9 @@ SUBROUTINE create_davidson_section(section,error)
"(works for FULL_KINETIC/SINGLE_INVERSE/S_INVERSE)"),&
enum_i_vals=(/ot_precond_solver_default,&
ot_precond_solver_direct,&
- ot_precond_solver_inv_chol/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ ot_precond_solver_inv_chol/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENERGY_GAP",&
description="Should be an estimate for the energy gap [a.u.] (HOMO-LUMO) and is used in preconditioning, "//&
@@ -6681,35 +6306,35 @@ SUBROUTINE create_davidson_section(section,error)
"of the gap (0.001 doing normally fine). For the other preconditioners, making this value larger (0.2)"//&
" will tame the preconditioner in case of poor initial guesses.",&
usage="ENERGY_GAP 0.001",&
- default_r_val=0.2_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NEW_PREC_EACH",&
description="Number of SCF iterations after which a new Preconditioner is computed",&
- usage="NEW_PREC_EACH 10", default_i_val=20,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NEW_PREC_EACH 10", default_i_val=20)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FIRST_PREC",&
description="First SCF iteration at which a Preconditioner is employed",&
- usage="FIRST_PREC 1", default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FIRST_PREC 1", default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CONV_MOS_PERCENT",&
description="Minimal percent of MOS that have to converge within the Davidson loop"//&
" before the SCF iteration is completed and a new Hamiltonian is computed",&
- usage="CONV_MOS_PERCENT 0.8", default_r_val=0.5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CONV_MOS_PERCENT 0.8", default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SPARSE_MOS",&
description="Use MOS as sparse matrix and avoid as much as possible multiplications with full matrices",&
usage="SPARSE_MOS",default_l_val=.TRUE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_davidson_section
@@ -6717,11 +6342,9 @@ END SUBROUTINE create_davidson_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_krylov_section(section,error)
+ SUBROUTINE create_krylov_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_krylov_section', &
routineP = moduleN//':'//routineN
@@ -6730,57 +6353,51 @@ SUBROUTINE create_krylov_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"KRYLOV",&
description=" ",&
- n_keywords=2, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="NKRYLOV",&
description="Dimension of the Krylov space used for the Lanczos refinement",&
usage="NKRYLOV 20",&
- default_i_val=4,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NBLOCK",&
description="Size of the block of vectors refined simultaneously by the Lanczos procedure",&
usage="NBLOCK 1",&
- default_i_val=32,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=32)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_KRYLOV",&
description="Convergence criterion for the MOs",&
usage="EPS_KRYLOV 0.00001",&
- default_r_val=0.0000001_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0000001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_STD_DIAG",&
description="Level of convergence to be reached before starting the Lanczos procedure."//&
" Above this threshold a standard diagonalization method is used. "//&
" If negative Lanczos is started at the first iteration",&
usage="EPS_STD_DIAG 0.001",&
- default_r_val=-1.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHECK_MOS_CONV",&
description="This requires to check the convergence of MOS also when standard "//&
"diagonalization steps are performed, if the block krylov approach is active.",&
usage="CHECK_MOS_CONV T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_krylov_section
@@ -6789,11 +6406,9 @@ END SUBROUTINE create_krylov_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_diag_subspace_section(section,error)
+ SUBROUTINE create_diag_subspace_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_diag_subspace_section', &
routineP = moduleN//':'//routineN
@@ -6803,12 +6418,11 @@ SUBROUTINE create_diag_subspace_section(section,error)
TYPE(section_type), POINTER :: subsection
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DIAG_SUB_SCF",&
description="Activation of self-consistenf subspace refinement by diagonalization "//&
"of H by adjusting the occupation but keeping the MOS unchanged.",&
- n_keywords=2, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -6816,60 +6430,53 @@ SUBROUTINE create_diag_subspace_section(section,error)
description="controls the activation of inner SCF loop to refine occupations in MOS subspace",&
usage="&DIAG_SUB_SCF T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of iterations for the SCF inner loop",&
usage="MAX_ITER 20",&
- default_i_val=2,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ENE",&
description="Required energy accuracy for convergence of subspace diagonalization",&
usage="EPS_ENE 1.e-8",&
- default_r_val=1.e-4_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.e-4_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ADAPT_SCF",&
description="Required density matrix accuracy as compared to current SCF convergence",&
usage="EPS_ADAPT_SCF 1.e-1",&
- default_r_val=1._dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SKIP_SUB_DIAG",&
description="Level of convergence to be reached before starting the internal loop of subspace rotations."//&
" Above this threshold only the outer diagonalization method is used. "//&
" If negative the subspace rotation is started at the first iteration",&
usage="EPS_SKIP_SUB_DIAG 0.001",&
- default_r_val=-1.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
-
- CALL create_mixing_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+
+ CALL create_mixing_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_diag_subspace_section
! *****************************************************************************
!> \brief makes the input section for core-level spectroscopy simulations
!> \param section ...
-!> \param error ...
!> \par History
!> 03.2005 created [MI]
! *****************************************************************************
- SUBROUTINE create_xas_section(section,error)
+ SUBROUTINE create_xas_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_xas_section', &
routineP = moduleN//':'//routineN
@@ -6880,15 +6487,14 @@ SUBROUTINE create_xas_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"xas",&
description="Sets the method of choice to calculate core-level excitation spectra. "//&
"The occupied states from which we calculate the "//&
"excitation should be specified. "//&
"Localization of the orbitals may be useful.",&
n_keywords=10, n_subsections=1, repeats=.FALSE., &
- citations=(/Iannuzzi2007/),&
- error=error)
+ citations=(/Iannuzzi2007/))
NULLIFY(keyword,subsection,print_key)
@@ -6896,10 +6502,9 @@ SUBROUTINE create_xas_section(section,error)
description="controls the activation of core-level spectroscopy simulations",&
usage="&XAS T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="METHOD",&
variants=(/"XAS_METHOD"/),&
@@ -6915,16 +6520,16 @@ SUBROUTINE create_xas_section(section,error)
"DSCF calculations to compute the first (core)excited state", &
"Transition potential with generalized core occupation and total number of electrons"),&
enum_i_vals=(/xas_none,xas_tp_hh,xas_tp_fh,xes_tp_val,xas_tp_xhh,&
- xas_tp_xfh,xas_dscf,xas_tp_flex/), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ xas_tp_xfh,xas_dscf,xas_tp_flex/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XAS_CORE",&
description="Occupation of the core state in XAS calculation by TP_FLEX.",&
usage="XAS_CORE 0.5",&
- default_r_val=0.5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
@@ -6933,27 +6538,27 @@ SUBROUTINE create_xas_section(section,error)
"If it is a negative value, the number of electrons is set to GS number of electrons "//&
"minus the amount subtracted from the core state",&
usage="XAS_TOT_EL 10",&
- default_r_val=-1._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XES_CORE",&
description="Occupation of the core state in XES calculation by TP_VAL. "//&
"The HOMO is emptied by the same amount.",&
usage="XES_CORE 0.5",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="XES_EMPTY_HOMO",&
description="Set the occupation of the HOMO in XES calculation by TP_VAL. "//&
"The HOMO can be emptied or not, if the core is still full.",&
usage="XES_EMPTY_HOMO",&
default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIPOLE_FORM",&
variants=(/"DIP_FORM"/),&
@@ -6964,18 +6569,18 @@ SUBROUTINE create_xas_section(section,error)
enum_c_vals=s2a( "LENGTH","VELOCITY" ),&
enum_desc=s2a("Length form 〈 i | e r | j 〉",&
"Velocity form 〈 i | d/dr | j 〉"),&
- enum_i_vals=(/xas_dip_len2,xas_dip_vel/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/xas_dip_len2,xas_dip_vel/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! replace the specialized keyword with standard scf section
! scf_env is added to xas_env
NULLIFY(subsection)
- CALL create_scf_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_scf_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="STATE_TYPE",&
@@ -6985,17 +6590,16 @@ SUBROUTINE create_xas_section(section,error)
default_i_val=xas_1s_type,&
enum_c_vals=s2a("1S","2S","2P"),&
enum_desc=s2a("1s orbitals","2s orbitals","2p orbitals"),&
- enum_i_vals=(/xas_1s_type,xas_2s_type,xas_2p_type/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/xas_1s_type,xas_2s_type,xas_2p_type/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STATE_SEARCH",&
description="# of states where to look for the one to be excited",&
usage="STATE_SEARCH 1",&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOMS_LIST",&
variants=(/"AT_LIST"/),&
@@ -7003,96 +6607,91 @@ SUBROUTINE create_xas_section(section,error)
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="ATOMS_LIST {integer} {integer} .. {integer} ",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ADDED_MOS",&
description="Number of additional MOS added spin up only",&
- usage="ADDED_MOS {integer}", default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ADDED_MOS {integer}", default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER_ADDED",&
description="maximum number of iteration in calculation of added orbitals",&
- usage="MAX_ITER_ADDED 100", default_i_val=2999,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER_ADDED 100", default_i_val=2999)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ADDED",&
description="target accuracy incalculation of the added orbitals",&
- usage="EPS_ADDED 1.e-6", default_r_val=1.0e-5_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_ADDED 1.e-6", default_r_val=1.0e-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGAUSS",&
description="Number of gto's for the expansion of the STO "//&
"of the type given by STATE_TYPE",&
- usage="NGAUSS {integer}", default_i_val=3,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NGAUSS {integer}", default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART",&
description="Restart the excited state if the restart file exists",&
usage="RESTART",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WFN_RESTART_FILE_NAME",&
variants=(/"RESTART_FILE_NAME"/),&
description="Root of the file names where to read the MOS from "//&
"which to restart the calculation of the core level excited states",&
usage="WFN_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_localize_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_localize_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,"PRINT",&
"printing of information during the core-level spectroscopy simulation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
! Add printing of wannier infos
- CALL print_wanniers(subsection, error)
+ CALL print_wanniers(subsection)
CALL cp_print_key_section_create(print_key,"iteration_info",&
description="Controls the printing of basic iteration information during the XAS SCF.", &
- print_level=low_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=low_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="time_cumul",&
description="If the printkey is activated switches the printing of timings"//&
" to cumulative (over the SCF).",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing of basic iteration information in CLS", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"XES_SPECTRUM",&
description="Controls the dumping of the CLS output files containing the emission spectra",&
- print_level=low_print_level,common_iter_levels=3,filename="",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,common_iter_levels=3,filename="")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"XAS_SPECTRUM",&
description="Controls the dumping of the CLS output files containing the absorption spectra",&
- print_level=low_print_level,common_iter_levels=3,filename="",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,common_iter_levels=3,filename="")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART",&
description="Controls the dumping of MO restart file during the SCF."//&
@@ -7101,64 +6700,61 @@ SUBROUTINE create_xas_section(section,error)
"employed only to restart the same type of CLS calculation, "//&
"i.e. with the same core potential.", &
print_level=low_print_level,common_iter_levels=3,each_iter_names=s2a("XAS_SCF"),&
- add_last=add_last_numeric,each_iter_values=(/3/),filename="",error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric,each_iter_values=(/3/),filename="")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CLS_FUNCTION_CUBES",&
description="Controls the printing of the relaxed orbitals ", &
- print_level=high_print_level,common_iter_levels=3,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,common_iter_levels=3,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LU_BOUNDS",&
variants=(/"CUBES_LU"/),&
description="The lower and upper index of the states to be printed as cube",&
usage="CUBES_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LIST",&
description="Indexes of the states to be printed as cube files"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="CUBES_LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_xas_section
! *****************************************************************************
!> \brief Create CP2K input section for the smearing of occupation numbers
!> \param section ...
-!> \param error ...
!> \date 27.08.2008
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
- SUBROUTINE create_smear_section(section,error)
+ SUBROUTINE create_smear_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'create_smear_section', &
routineP = moduleN//':'//routineN
@@ -7168,7 +6764,7 @@ SUBROUTINE create_smear_section(section,error)
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,&
@@ -7176,8 +6772,7 @@ SUBROUTINE create_smear_section(section,error)
description="Define the smearing of the MO occupation numbers",&
n_keywords=6,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
NULLIFY (keyword)
@@ -7186,10 +6781,9 @@ SUBROUTINE create_smear_section(section,error)
description="Controls the activation of smearing",&
usage="&SMEAR ON",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="METHOD",&
@@ -7200,10 +6794,9 @@ SUBROUTINE create_smear_section(section,error)
enum_i_vals=(/smear_fermi_dirac,smear_energy_window,smear_list/),&
enum_desc=s2a("Fermi-Dirac distribution defined by the keyword ELECTRONIC_TEMPERATURE",&
"Energy window defined by the keyword WINDOW_SIZE",&
- "Use a fixed list of occupations"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Use a fixed list of occupations"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="LIST",&
@@ -7212,10 +6805,9 @@ SUBROUTINE create_smear_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
type_of_var=real_t,&
- usage="LIST 2.0 0.6666 0.6666 0.66666 0.0 0.0",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LIST 2.0 0.6666 0.6666 0.66666 0.0 0.0")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="ELECTRONIC_TEMPERATURE",&
@@ -7224,12 +6816,11 @@ SUBROUTINE create_smear_section(section,error)
repeats=.FALSE.,&
n_var=1,&
type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=300.0_dp, unit_str="K", error=error),&
+ default_r_val=cp_unit_to_cp2k(value=300.0_dp, unit_str="K"),&
unit_str="K",&
- usage="ELECTRONIC_TEMPERATURE [K] 300",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ELECTRONIC_TEMPERATURE [K] 300")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="EPS_FERMI_DIRAC",&
@@ -7238,10 +6829,9 @@ SUBROUTINE create_smear_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=1.0E-10_dp,&
- usage="EPS_FERMI_DIRAC 1.0E-6",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_FERMI_DIRAC 1.0E-6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="WINDOW_SIZE",&
@@ -7251,10 +6841,9 @@ SUBROUTINE create_smear_section(section,error)
type_of_var=real_t,&
default_r_val=0.0_dp,&
unit_str="au_e",&
- usage="WINDOW_SIZE [eV] 0.3",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WINDOW_SIZE [eV] 0.3")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FIXED_MAGNETIC_MOMENT",&
description="Imposed difference between the numbers of electrons of spin up "//&
@@ -7265,10 +6854,9 @@ SUBROUTINE create_smear_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=-100.0_dp,&
- usage="FIXED_MAGNETIC_MOMENT 1.5",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FIXED_MAGNETIC_MOMENT 1.5")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_smear_section
@@ -7277,11 +6865,9 @@ END SUBROUTINE create_smear_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_rtp_section(section,error)
+ SUBROUTINE create_rtp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_rtp_section', &
routineP = moduleN//':'//routineN
@@ -7292,38 +6878,34 @@ SUBROUTINE create_rtp_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"REAL_TIME_PROPAGATION",&
description="Parameters needed to set up the real time propagation"//&
" for the electron dynamics",&
n_keywords=4, n_subsections=4, repeats=.FALSE., &
- citations=(/Kunert2003/),&
- error=error)
+ citations=(/Kunert2003/))
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximal number of iterations for the self consistent propagator loop.",&
usage="MAX_ITER 10",&
- default_i_val=10,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=10)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_ITER",&
description="Convergence criterium for the self consistent propagator loop.",&
usage="EPS_ITER 1.0E-5",&
- default_r_val=1.0E-7_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ASPC_ORDER",&
description="Speciefies how many steps will be used for extrapolation. "//&
"One will be always used which is means X(t+dt)=X(t)",&
usage="ASPC_ORDER 3",&
- default_i_val=3,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAT_EXP",&
description="Which method should be used to calculate the exponential"//&
@@ -7338,37 +6920,34 @@ SUBROUTINE create_rtp_section(section,error)
"uses arnoldi subspace algorithm to compute exp(H)*MO directly, can't be used in "//&
"combination with Crank Nicholson or density propagation",&
"Uses a Baker-Campbell-Hausdorff expansion to propagate the density matrix,"//&
- " only works for density propagation"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ " only works for density propagation"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DENSITY_PROPAGATION",&
description="The density matrix is propagated instead of the molecular orbitals. "//&
"This allows for a linear scaling simulation",&
usage="DENSITY_PROPAGATION .TRUE.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SC_CHECK_START",&
description="Speciefies how many iteration steps will be done without "//&
"a check for self consistency. Can save some time in big calculations.",&
usage="SC_CHECK_START 3",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXP_ACCURACY",&
description="Accuracy for the taylor and pade approximation. "//&
"This is only an upper bound bound since the norm used for the guess "//&
"is an upper bound for the needed one.",&
usage="EXP_ACCURACY 1.0E-6",&
- default_r_val=1.0E-9_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-9_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PROPAGATOR",&
description="Which propagator should be used for the orbitals",&
@@ -7377,10 +6956,9 @@ SUBROUTINE create_rtp_section(section,error)
enum_i_vals=(/do_etrs,do_cn,do_em/),&
enum_desc=s2a("enforced time reversible symmetry",&
"Crank Nicholson propagator",&
- "Exponential midpoint propagator"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Exponential midpoint propagator"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INITIAL_WFN",&
description="Controls the initial WFN used for propagation.",&
@@ -7391,18 +6969,17 @@ SUBROUTINE create_rtp_section(section,error)
"A wavefunction from a previous SCF is propagated. Especially useful,"//&
" if electronic constraints or restraints are used in the previous calculation, "//&
"since these do not work in the rtp scheme.",&
- "use the wavefunction of a real time propagation/ehrenfest run"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "use the wavefunction of a real time propagation/ehrenfest run"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPLY_DELTA_PULSE",&
description="Applies a delta kick to the initial wfn (only RTP for now - the EMD "//&
" case is not yet implemented).",&
usage="APPLY_DELTA_PULSE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PERIODIC",&
description="Apply a delta-kick that is compatible with periodic boundary conditions"//&
@@ -7410,9 +6987,9 @@ SUBROUTINE create_rtp_section(section,error)
" the initial wfn. Note that the pulse is only applied when INITIAL_WFN is set to SCF_WFN,"//&
" and not for restarts (RT_RESTART).",&
usage="PERIODIC",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA_PULSE_DIRECTION",&
description="Direction of the applied electric field. The k vector is given as"//&
@@ -7420,69 +6997,67 @@ SUBROUTINE create_rtp_section(section,error)
" the unit cell, only if DELTA_PULSE_SCALE is set to unity. For an orthorhombic cell"//&
" [1,0,0] yields [2*Pi/L_x,0,0]. For small cells, this results in a very large kick.",&
usage="DELTA_PULSE_DIRECTION 1 1 1",n_var=3,default_i_vals=(/1,0,0/),&
- type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA_PULSE_SCALE",&
description="Scale the k vector, which for PERIODIC .FALSE. results in exp(ikr) no"//&
" longer being periodic with the unit cell. The norm of k is the strength of the"//&
" applied electric field in atomic units.",&
- usage="DELTA_PULSE_SCALE 0.01 ",n_var=1,default_r_val=0.001_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DELTA_PULSE_SCALE 0.01 ",n_var=1,default_r_val=0.001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HFX_BALANCE_IN_CORE",&
description="If HFX is used, this keyword forces a redistribution/recalculation"//&
" of the integrals, balanced with respect to the in core steps.",&
usage="HFX_BALANCE_IN_CORE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORTHONORMAL",&
description="Performs rtp in the orthonormal basis. This keyword is only intended for development purposes."//&
"It should not be used outside code development",&
usage="ORTHONORMAL",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MCWEENY_MAX_ITER",&
description="Determines the maximum amount of McWeeny steps used after each converged"//&
" step in density propagation",&
- usage="MCWEENY_MAX_ITER 2",default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MCWEENY_MAX_ITER 2",default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ACCURACY_REFINEMENT",&
description="If using density propagation some parts should be calculated with a higher accuracy than the rest"//&
" to reduce numerical noise. This factor determines by how much the filtering threshold is"//&
" reduced for these calculations.",&
- usage="ACCURACY_REFINEMENT",default_i_val=100,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ACCURACY_REFINEMENT",default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MCWEENY_EPS",&
description="Threshold after which McWeeny is terminated",&
usage="MCWEENY_EPS 0.00001",&
- default_r_val=0.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_section)
CALL section_create(print_section,name="PRINT",&
description="Section of possible print options for an RTP runs",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing within real time propagation and Eherenfest dynamics",&
- print_level=low_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(print_section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(print_section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART",&
@@ -7491,30 +7066,30 @@ SUBROUTINE create_rtp_section(section,error)
"See also RESTART_HISTORY. In density propagation this controls the printing of P", &
print_level=low_print_level, common_iter_levels=3,&
each_iter_names=s2a("MD"),each_iter_values=(/20/), &
- add_last=add_last_numeric,filename="RESTART",error=error)
+ add_last=add_last_numeric,filename="RESTART")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum index of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=3, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART_HISTORY",&
description="Dumps unique MO restart files during the run keeping all of them.",&
print_level=low_print_level, common_iter_levels=0,&
each_iter_names=s2a("MD"),&
each_iter_values=(/500/), &
- filename="RESTART",error=error)
+ filename="RESTART")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum index of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=3, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(print_section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(print_section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CURRENT",&
description="Print the current during an EMD simulation to cube files."//&
@@ -7522,26 +7097,26 @@ SUBROUTINE create_rtp_section(section,error)
print_level=high_print_level, common_iter_levels=0,&
each_iter_names=s2a("MD"),&
each_iter_values=(/20/), &
- filename="current",error=error)
+ filename="current")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum index of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=1, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STRIDE",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(print_section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(print_section,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,print_section,error=error)
- CALL section_release(print_section,error=error)
+ CALL section_add_subsection(section,print_section)
+ CALL section_release(print_section)
END SUBROUTINE create_rtp_section
@@ -7549,11 +7124,9 @@ END SUBROUTINE create_rtp_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_constant_env_section(section,error)
+ SUBROUTINE create_constant_env_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_constant_env_section', &
routineP = moduleN//':'//routineN
@@ -7563,40 +7136,35 @@ SUBROUTINE create_constant_env_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"CONSTANT_ENV",&
description="parameters for a constant envelop",&
- n_keywords=6, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="START_STEP",&
description="First step the field is applied ",&
usage="START_STEP 0",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="END_STEP",&
description="Last step the field is applied",&
usage="END_STEP 2",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_constant_env_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_gaussian_env_section(section,error)
+ SUBROUTINE create_gaussian_env_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gaussian_env_section', &
routineP = moduleN//':'//routineN
@@ -7606,11 +7174,10 @@ SUBROUTINE create_gaussian_env_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"GAUSSIAN_ENV",&
description="parameters for a gaussian envelop",&
- n_keywords=6, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
@@ -7618,27 +7185,25 @@ SUBROUTINE create_gaussian_env_section(section,error)
description="Center of the gaussian envelop (maximum of the gaussian)",&
usage="T0 2.0E0",&
default_r_val=0.0E0_dp,&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIGMA",&
description="Width of the gaussian ",&
usage="SIGMA 2.0E0",&
default_r_val=-1.0E0_dp,&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_gaussian_env_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ramp_env_section(section,error)
+ SUBROUTINE create_ramp_env_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ramp_env_section', &
routineP = moduleN//':'//routineN
@@ -7648,61 +7213,54 @@ SUBROUTINE create_ramp_env_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"RAMP_ENV",&
description="Parameters for an trapeziodal envelop ",&
- n_keywords=6, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="START_STEP_IN",&
description="Step when the electric field starts to be applied ",&
usage="START_STEP_IN 0",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="END_STEP_IN",&
description="Step when the field reaches the full strength",&
usage="END_STEP_IN 2",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="START_STEP_OUT",&
description="Step when the field starts to vanish ",&
usage="START_STEP 0",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="END_STEP_OUT",&
description="Step when the field disappears",&
usage="END_TIME 2",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ramp_env_section
! *****************************************************************************
!> \brief Create CP2K input section for the SCCS model
!> \param section ...
-!> \param error ...
!> \par History:
!> - Creation (10.10.2013,MK)
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
- SUBROUTINE create_sccs_section(section,error)
+ SUBROUTINE create_sccs_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'create_sccs_section', &
routineP = moduleN//':'//routineN
@@ -7713,7 +7271,7 @@ SUBROUTINE create_sccs_section(section,error)
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,&
@@ -7722,8 +7280,7 @@ SUBROUTINE create_sccs_section(section,error)
citations=(/Fattebert2002,Andreussi2012/),&
n_keywords=8,&
n_subsections=2,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
NULLIFY (keyword)
@@ -7732,10 +7289,9 @@ SUBROUTINE create_sccs_section(section,error)
description="Controls the activation of the SCCS section",&
usage="&SCCS ON",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="ALPHA",&
@@ -7746,10 +7302,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0_dp,&
- unit_str="mN/m",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="mN/m")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="BETA",&
@@ -7760,10 +7315,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0_dp,&
- unit_str="GPa",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="GPa")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="DELTA_RHO",&
@@ -7772,10 +7326,9 @@ SUBROUTINE create_sccs_section(section,error)
repeats=.FALSE.,&
n_var=1,&
type_of_var=real_t,&
- default_r_val=2.0E-5_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=2.0E-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="DERIVATIVE_METHOD",&
@@ -7792,10 +7345,9 @@ SUBROUTINE create_sccs_section(section,error)
enum_desc=s2a("Fast Fourier transformation",&
"3-point stencil central differences",&
"5-point stencil central differences",&
- "7-point stencil central differences"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "7-point stencil central differences"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="DIELECTRIC_CONSTANT",&
@@ -7805,10 +7357,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=80.0_dp,&
- usage="DIELECTRIC_CONSTANT 78.36",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DIELECTRIC_CONSTANT 78.36")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="EPS_SCCS",&
@@ -7819,10 +7370,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=1.0E-6_dp,&
- usage="EPS_ITER 1.0E-7",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_ITER 1.0E-7")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="EPS_SCF",&
@@ -7832,10 +7382,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.5_dp,&
- usage="EPS_SCF 1.0E-2",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 1.0E-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="GAMMA",&
@@ -7847,10 +7396,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0_dp,&
- unit_str="mN/m",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="mN/m")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="MAX_ITER",&
@@ -7860,10 +7408,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=integer_t,&
default_i_val=100,&
- usage="MAX_ITER 50",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 50")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="METHOD",&
@@ -7873,10 +7420,9 @@ SUBROUTINE create_sccs_section(section,error)
enum_c_vals=s2a("ANDREUSSI","FATTEBERT-GYGI"),&
enum_i_vals=(/sccs_andreussi,sccs_fattebert_gygi/),&
enum_desc=s2a("Smoothing function proposed by Andreussi et al.",&
- "Smoothing function proposed by Fattebert and Gygi"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Smoothing function proposed by Fattebert and Gygi"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="MIXING",&
@@ -7886,10 +7432,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.6_dp,&
- usage="MIXING 0.2",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MIXING 0.2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY (subsection)
@@ -7900,8 +7445,7 @@ SUBROUTINE create_sccs_section(section,error)
citations=(/Andreussi2012/),&
n_keywords=2,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword,&
name="RHO_MAX",&
@@ -7910,10 +7454,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0035_dp,&
- usage="RHO_MAX 0.01",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RHO_MAX 0.01")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="RHO_MIN",&
@@ -7922,13 +7465,12 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0001_dp,&
- usage="RHO_MIN 0.0003",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RHO_MIN 0.0003")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,&
name="FATTEBERT-GYGI",&
@@ -7937,8 +7479,7 @@ SUBROUTINE create_sccs_section(section,error)
citations=(/Fattebert2002/),&
n_keywords=2,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword,&
name="BETA",&
@@ -7947,10 +7488,9 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=1.7_dp,&
- usage="BETA 1.3",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="BETA 1.3")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="RHO_ZERO",&
@@ -7961,13 +7501,12 @@ SUBROUTINE create_sccs_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=0.0006_dp,&
- usage="RHO_ZERO 0.0004",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RHO_ZERO 0.0004")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_sccs_section
diff --git a/src/input_cp2k_distribution.F b/src/input_cp2k_distribution.F
index 2d5410d45c..ee06ce45d1 100644
--- a/src/input_cp2k_distribution.F
+++ b/src/input_cp2k_distribution.F
@@ -36,13 +36,10 @@ MODULE input_cp2k_distribution
! *****************************************************************************
!> \brief Creates the distribution section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele
! *****************************************************************************
- SUBROUTINE create_distribution_section(section,error)
+ SUBROUTINE create_distribution_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_distribution_section', &
routineP = moduleN//':'//routineN
@@ -52,11 +49,10 @@ SUBROUTINE create_distribution_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DISTRIBUTION",&
description="can be used used to tune the parallel distribution of the data",&
- n_keywords=2, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=2, repeats=.FALSE.)
NULLIFY(keyword)
@@ -68,56 +64,56 @@ SUBROUTINE create_distribution_section(section,error)
enum_desc=s2a("the number of blocks",&
"the number of blocks weighted by the number elements per block",&
"the number of blocks weighted by the sum of the lmax"), &
- default_i_val=model_block_count,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=model_block_count)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="2D_MOLECULAR_DISTRIBUTION",&
description="Distribute the atoms so that atoms belonging to a given molecule"//&
" are on the same CPU for the 2D distribution. This might give rise to a"//&
" worse distribution but reduces memory needs of finding the optimal distribution.",&
usage="2D_MOLECULAR_DISTRIBUTION TRUE",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SKIP_OPTIMIZATION",&
description="Do not optimize the distribution, go for something very simple."//&
" Might be useful if the optimization, which scales quadratically in system size, is too expensive.",&
usage="SKIP_OPTIMIZATION TRUE",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIC_OPTIMIZATION",&
description="Creates a distribution based on a few heuristics using only minimal memory "//&
"and CPU time.",&
usage="BASIC_OPTIMIZATION TRUE",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIC_SPATIAL_OPTIMIZATION",&
description="Creates a distribution with spatial info, using only minimal memory "//&
"and CPU time.",&
usage="BASIC_SPATIAL_OPTIMIZATION TRUE",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIC_CLUSTER_OPTIMIZATION",&
description="Creates a distribution with spatial info, using recursively KMEANS clustering. ",&
usage="BASIC_CLUSTER_OPTIMIZATION TRUE",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SYMMETRIC",&
description="Take the symmetry of the distribution_2d into account.",&
usage="SYMMETRIC TRUE",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_distribution_section
diff --git a/src/input_cp2k_eip.F b/src/input_cp2k_eip.F
index fecac9a41c..e718e5cb2f 100644
--- a/src/input_cp2k_eip.F
+++ b/src/input_cp2k_eip.F
@@ -40,15 +40,12 @@ MODULE input_cp2k_eip
! *****************************************************************************
!> \brief Create the input section for EIP
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \par History
!> 03.2006 created
!> \author Thomas D. Kuehne (tkuehne@phys.chem.ethz.ch)
! *****************************************************************************
- SUBROUTINE create_eip_section(section, error)
+ SUBROUTINE create_eip_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_eip_section', &
routineP = moduleN//':'//routineN
@@ -61,12 +58,11 @@ SUBROUTINE create_eip_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EIP", &
description="This section contains all information to run an "//&
"Empirical Interatomic Potential (EIP) calculation.", &
- n_keywords=1, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.FALSE.)
NULLIFY(subsection, keyword)
@@ -79,13 +75,13 @@ SUBROUTINE create_eip_section(section, error)
enum_desc=s2a("Bazant potentials",&
"Environment-Dependent Interatomic Potential",&
"Lenosky potentials"),&
- default_i_val=use_lenosky_eip, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ default_i_val=use_lenosky_eip)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
- CALL create_eip_print_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error)
- CALL section_release(subsection, error=error)
+ CALL create_eip_print_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_eip_section
@@ -93,15 +89,12 @@ END SUBROUTINE create_eip_section
! *****************************************************************************
!> \brief Creates the print section for the eip subsection
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \par History
!> 03.2006 created
!> \author Thomas D. Kuehne (tkuehne@phys.chem.ethz.ch)
! *****************************************************************************
- SUBROUTINE create_eip_print_section(section, error)
+ SUBROUTINE create_eip_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_eip_print_section', &
routineP = moduleN//':'//routineN
@@ -113,55 +106,48 @@ SUBROUTINE create_eip_print_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section, name="PRINT", &
description="Section of possible print options in EIP code.", &
- n_keywords=0, n_subsections=6, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=6, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key, "ENERGIES", &
description="Controls the printing of the EIP energies.", &
- print_level=medium_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "ENERGIES_VAR", &
description="Controls the printing of the variance of the EIP energies.", &
- print_level=high_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "FORCES", &
description="Controls the printing of the EIP forces.", &
- print_level=medium_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "COORD_AVG", &
description="Controls the printing of the average coordination number.", &
- print_level=high_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "COORD_VAR", &
description="Controls the printing of the variance of the coordination number.", &
- print_level=high_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "COUNT", &
description="Controls the printing of the number of function calls.", &
- print_level=high_print_level, filename="__STD_OUT__", &
- error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_eip_print_section
diff --git a/src/input_cp2k_force_eval.F b/src/input_cp2k_force_eval.F
index 8d57e7f2d9..5a16bab4ab 100644
--- a/src/input_cp2k_force_eval.F
+++ b/src/input_cp2k_force_eval.F
@@ -57,13 +57,10 @@ MODULE input_cp2k_force_eval
! *****************************************************************************
!> \brief creates the force_eval section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_force_eval_section(section,error)
+ SUBROUTINE create_force_eval_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_force_eval_section', &
routineP = moduleN//':'//routineN
@@ -74,12 +71,11 @@ SUBROUTINE create_force_eval_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="force_eval",&
description="parameters needed to calculate energy and forces and"//&
" describe the system you want to analyze.",&
- n_keywords=1, n_subsections=9, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=9, repeats=.TRUE.)
NULLIFY(subsection)
NULLIFY(keyword)
@@ -99,9 +95,9 @@ SUBROUTINE create_force_eval_section(section,error)
"Electronic structure methods (DFT, ...)",&
"Use a combination of two of the above"),&
enum_i_vals=(/do_qs, do_fist, do_qmmm, do_eip, do_qs, do_mixed/),&
- default_i_val=do_qs, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qs)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STRESS_TENSOR",&
description="Controls the calculation of the stress tensor. The combinations defined below"//&
@@ -115,67 +111,64 @@ SUBROUTINE create_force_eval_section(section,error)
"Compute the stress tensor analytically (if available).",&
"Compute the stress tensor numerically.",&
"Compute the diagonal part only of the stress tensor analytically (if available).",&
- "Compute the diagonal part only of the stress tensor numerically"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Compute the diagonal part only of the stress tensor numerically"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_ext_pot_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ext_pot_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_rescale_force_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rescale_force_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_mix_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mix_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_dft_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dft_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_mm_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_eip_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_eip_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_bsse_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_bsse_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_subsys_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_subsys_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_properties_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_properties_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_f_env_print_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_f_env_print_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_force_eval_section
! *****************************************************************************
!> \brief Creates the section for applying an external potential
!> \param section ...
-!> \param error ...
!> \date 03.2008
!> \author teo
! *****************************************************************************
- SUBROUTINE create_ext_pot_section(section,error)
+ SUBROUTINE create_ext_pot_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ext_pot_section', &
routineP = moduleN//':'//routineN
@@ -185,62 +178,61 @@ SUBROUTINE create_ext_pot_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EXTERNAL_POTENTIAL",&
description="Section controlling the presence of an external potential dependent "//&
" on the atomic positions (X,Y,Z)",&
- n_keywords=7, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS_LIST",&
description="Specifies the atoms on which the external potential will act",&
usage="ATOMS_LIST {INT} {INT} ..",repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTION",&
description="Specifies the functional form in mathematical notation. Variables must be the atomic "//&
"coordinates (X,Y,Z).",usage="FUNCTION X^2+Y^2+Z^2+LOG(ABS(X+Y))", &
- type_of_var=lchar_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNITS",&
description="Optionally, allows to define valid CP2K unit strings for each parameter value. "//&
"It is assumed that the corresponding parameter value is specified in this unit.",&
usage="UNITS angstrom eV*angstrom^-1 angstrom^1 K", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DX",&
description="Parameter used for computing the derivative with the Ridders' method.",&
- usage="DX ", default_r_val=0.1_dp, unit_str="bohr", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=0.1_dp, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERROR_LIMIT",&
description="Checks that the error in computing the derivative is not larger than "//&
"the value set; in case error is larger a warning message is printed.",&
- usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ext_pot_section
@@ -248,13 +240,10 @@ END SUBROUTINE create_ext_pot_section
! *****************************************************************************
!> \brief Creates the section controlling the rescaling of forces
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_rescale_force_section(section,error)
+ SUBROUTINE create_rescale_force_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_rescale_force_section', &
routineP = moduleN//':'//routineN
@@ -264,12 +253,11 @@ SUBROUTINE create_rescale_force_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RESCALE_FORCES",&
description="Section controlling the rescaling of forces. Useful when"//&
" starting from quite bad geometries with unphysically large forces.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="MAX_FORCE",&
@@ -277,25 +265,20 @@ SUBROUTINE create_rescale_force_section(section,error)
" of one atom exceed this value it's rescaled to the MAX_FORCE"//&
" value.",&
default_r_val=cp_unit_to_cp2k(value=50.0_dp,&
- unit_str="kcalmol*angstrom^-1",&
- error=error),&
- unit_str="hartree*bohr^-1",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="kcalmol*angstrom^-1"),&
+ unit_str="hartree*bohr^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_rescale_force_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_f_env_print_section(section,error)
+ SUBROUTINE create_f_env_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_f_env_print_section', &
routineP = moduleN//':'//routineN
@@ -309,82 +292,77 @@ SUBROUTINE create_f_env_print_section(section,error)
NULLIFY (keyword)
NULLIFY (print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PRINT",&
description="Properties that you want to output and that are common to all methods",&
- n_keywords=0, n_subsections=5, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=5, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of basic information generated by force_eval", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FORCES",&
description="Controls the printing of the forces after each force evaluation",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
CALL keyword_create(keyword=keyword,&
name="NDIGITS",&
description="Specifies the number of digits used "//&
"for the printing of the forces",&
usage="NDIGITS 6",&
default_i_val=8,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"GRID_INFORMATION",&
description="Controls the printing of information regarding the PW and RS grid structures.",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"TOTAL_NUMBERS",&
description="Controls the printing of the total number of atoms, kinds,...",&
- print_level=medium_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DISTRIBUTION",&
description="Controls the printing of the distribution of molecules, atoms, ...",&
- print_level=medium_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DISTRIBUTION2D",&
description="Controls the printing of the distribution of matrix blocks,...",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DISTRIBUTION1D",&
description="Each node prints out its distribution info ...",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"STRESS_TENSOR",&
description="Controls the printing of the stress tensor",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
CALL keyword_create(keyword=keyword,&
name="NDIGITS",&
description="Specifies the number of digits used "//&
"for the printing of the stress tensor",&
usage="NDIGITS 6",&
default_i_val=8,&
- repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_f_env_print_section
diff --git a/src/input_cp2k_free_energy.F b/src/input_cp2k_free_energy.F
index bdec334eec..ffa15536b3 100644
--- a/src/input_cp2k_free_energy.F
+++ b/src/input_cp2k_free_energy.F
@@ -51,13 +51,10 @@ MODULE input_cp2k_free_energy
! *****************************************************************************
!> \brief creates the free energy section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_fe_section(section,error)
+ SUBROUTINE create_fe_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_fe_section', &
routineP = moduleN//':'//routineN
@@ -68,12 +65,11 @@ SUBROUTINE create_fe_section(section,error)
failure=.FALSE.
NULLIFY (subsection,keyword,print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="free_energy",&
description="Controls the calculation of free energy and free energy derivatives"//&
" with different possible methods",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="METHOD",&
description="Defines the method to use to compute free energy.",&
@@ -83,43 +79,39 @@ SUBROUTINE create_fe_section(section,error)
enum_desc=s2a("Metadynamics",&
"Umbrella Integration",&
"Alchemical Change"),&
- default_i_val=do_fe_meta,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_fe_meta,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_metadyn_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_metadyn_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ui_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ui_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ac_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ac_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(print_key,"free_energy_info",&
description="Controls the printing of basic and summary information during the"//&
" Free Energy calculation", &
print_level=low_print_level,each_iter_names=s2a("MD"),&
- each_iter_values=(/1/),add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ each_iter_values=(/1/),add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_fe_section
! *****************************************************************************
!> \brief creates the metadynamics section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_metadyn_section(section,error)
+ SUBROUTINE create_metadyn_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_metadyn_section', &
routineP = moduleN//':'//routineN
@@ -130,27 +122,27 @@ SUBROUTINE create_metadyn_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="metadyn",&
description="This section sets parameters to set up a calculation of metadynamics.",&
n_keywords=1, n_subsections=1, repeats=.FALSE., &
- citations=(/VandenCic2006/),error=error)
+ citations=(/VandenCic2006/))
NULLIFY(subsection,keyword,print_key)
CALL keyword_create(keyword, name="USE_PLUMED",&
description="Specify whether to use plumed as an external metadynamics driver.",&
usage="USE_PLUMED .FALSE./.TRUE.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PLUMED_INPUT_FILE",&
description="Specify the file name of the external plumed input file",&
usage="PLUMED_INPUT_FILE ./FILENAME",&
- default_c_val="./plumed.dat",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="./plumed.dat")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_NT_HILLS",&
description="Specify the minimum MD step interval between spawning "//&
@@ -158,47 +150,47 @@ SUBROUTINE create_metadyn_section(section,error)
"is used, if MIN_DISP is satisfied before MIN_NT_HILLS MD steps have been "//&
"performed, the MD will continue without any spawning until MIN_NT_HILLS is "//&
"reached. The default value has the net effect of skipping this check.",&
- usage="MIN_NT_HILLS {integer}",default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MIN_NT_HILLS {integer}",default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NT_HILLS",&
description="Specify the maximum MD step interval between spawning "//&
"two hills. When negative, no new hills are spawned and only "//&
"the hills read from SPAWNED_HILLS_* are in effect. The latter"//&
"is useful when one wants to add a custom constant bias potential.",&
- usage="NT_HILLS {integer}",default_i_val=30,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NT_HILLS {integer}",default_i_val=30)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMPERATURE",&
description="If a Lagrangian scheme is used the temperature for the collective "//&
"variables is specified. ",usage="TEMPERATURE ",&
- default_r_val=0.0_dp,unit_str='K',error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp,unit_str='K')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!RG Adaptive hills
CALL keyword_create(keyword, name="MIN_DISP",&
description="Minimum displacement between hills before placing a new hill.",&
usage="MIN_DISP ",&
- default_r_val=-1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OLD_HILL_NUMBER",&
description="Index of the last hill spawned for this walker.Needed to calculate MIN_DISP",&
usage="OLD_HILL_NUMBER ",&
- default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OLD_HILL_STEP",&
description="Timestep of the last hill spawned for this walker.Needed to calculate MIN_DISP",&
usage="OLD_HILL_STEP ",&
- default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!RG Adaptive hills
!Hills tail damping
@@ -210,149 +202,146 @@ SUBROUTINE create_metadyn_section(section,error)
" X0 and SCALE are METAVAR-dependent. "//&
" (1-(|x-X0|/HILL_TAIL_CUTOFF*SCALE)^P_EXP)/(1-(|x-X0|/HILL_TAIL_CUTOFF*SCALE)^Q_EXP)",&
usage="HILL_TAIL_CUTOFF ",&
- default_r_val=-1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="P_EXPONENT",&
description="Exponent at the numerator of the cutoff function to damp the tail of the Gaussian.",&
usage="P_EXPONENT ",&
- default_i_val=8,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=8)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Q_EXPONENT",&
description="Exponent at the denominator of the cutoff function to damp the tail of the Gaussian.",&
usage="Q_EXPONENT ",&
- default_i_val=20,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=20)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SLOW_GROWTH",&
description="Let the last hill grow slowly over NT_HILLS. ",&
usage="SLOW_GROWTH {logical}",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMP_TOL",&
description="If a Lagrangian scheme is used the temperature tolerance for the collective "//&
"variables is specified.",usage="TEMP_TOL ",&
- unit_str='K',default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str='K',default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LANGEVIN",&
description="If a Lagrangian scheme is used the eq. motion of the COLVARS are integrated "//&
"with a LANGEVIN scheme.",&
usage="LANGEVIN {logical}",&
citations=(/VandenCic2006/),&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WW",&
description="Specifies the height of the gaussian to spawn. Default 0.1 .",&
- usage="WW ",unit_str='hartree',default_r_val=0.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WW ",unit_str='hartree',default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_HILLS",&
description="This keyword enables the spawning of the hills. Default .FALSE.",&
- usage="DO_HILLS",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_HILLS",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WELL_TEMPERED",&
description="This keyword enables Well-tempered metadynamics. Default .FALSE.",&
usage="WELL_TEMPERED",citations=(/BarducBus2008/),&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA_T",&
description="If Well-tempered metaD is used, the temperature parameter "//&
"must be specified.",usage="DELTA_T ",&
- unit_str='K',default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str='K',default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WTGAMMA",&
description="If Well-tempered metaD is used, the gamma parameter "//&
"must be specified if not DELTA_T.",usage="WTGAMMA ",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LAGRANGE",&
description="Specifies whether an extended-lagrangian should be used. Default .FALSE.",&
- usage="LAGRANGE",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LAGRANGE",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="step_start_val",&
description="The starting step value for metadynamics",&
- usage="step_start_val ",default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="step_start_val ",default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="nhills_start_val",&
description="The starting value of previously spawned hills",&
- usage="nhills_start_val ",default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="nhills_start_val ",default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="COLVAR_AVG_TEMPERATURE_RESTART",&
description="COLVAR average temperature. Only for restarting purposes.",&
- usage="COLVAR_AVG_TEMPERATURE_RESTART 0.0",default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COLVAR_AVG_TEMPERATURE_RESTART 0.0",default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="TAMCSteps",&
description="Number of sampling points for z",&
- usage="TAMCSteps ",default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TAMCSteps ",default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="timestep",&
description="The length of an integration step for colvars (TAMC only)",&
- usage="timestep ",default_r_val=cp_unit_to_cp2k(value=0.5_dp,unit_str="fs",error=error),&
- unit_str="fs",error=error)
+ usage="timestep ",default_r_val=cp_unit_to_cp2k(value=0.5_dp,unit_str="fs"),&
+ unit_str="fs")
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_metavar_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_metavar_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_multiple_walkers_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_multiple_walkers_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="print",&
description="Controls the printing properties during an metadynamics run",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing of basic and summary information during"//&
" metadynamics.", &
print_level=low_print_level,each_iter_names=s2a("MD","METADYNAMICS"),&
- each_iter_values=(/1,1/),add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ each_iter_values=(/1,1/),add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"temperature_colvar",&
description="Controls the printing of the temperature of COLVARS in an "//&
"extended lagrangian scheme.", &
print_level=low_print_level,each_iter_names=s2a("MD","METADYNAMICS"),&
- each_iter_values=(/1,1/),add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ each_iter_values=(/1,1/),add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"COLVAR",&
description="Controls the printing of COLVAR summary information during"//&
@@ -367,10 +356,9 @@ SUBROUTINE create_metadyn_section(section,error)
" Lagrangian. When the extended Lagrangian is not used, all"//&
" related fields are omitted.",&
print_level=low_print_level,each_iter_names=s2a("MD","METADYNAMICS"),&
- each_iter_values=(/1,1/),add_last=add_last_numeric,filename="COLVAR",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ each_iter_values=(/1,1/),add_last=add_last_numeric,filename="COLVAR")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"HILLS",&
description="Controls the printing of HILLS summary information during"//&
@@ -378,27 +366,23 @@ SUBROUTINE create_metadyn_section(section,error)
" the spawned gaussian and height of the gaussian. According the value of "//&
" the EACH keyword this file may not be synchronized with the COLVAR file.", &
print_level=high_print_level,each_iter_names=s2a("MD","METADYNAMICS"),&
- each_iter_values=(/1,1/),add_last=add_last_numeric,filename="HILLS",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ each_iter_values=(/1,1/),add_last=add_last_numeric,filename="HILLS")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_metadyn_history(subsection, section, error)
+ CALL create_metadyn_history(subsection, section)
END SUBROUTINE create_metadyn_section
! *****************************************************************************
!> \brief creates the multiple walker section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teodoro laino [tlaino] 10.2008
! *****************************************************************************
- SUBROUTINE create_multiple_walkers_section(section,error)
+ SUBROUTINE create_multiple_walkers_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_multiple_walkers_section', &
@@ -409,74 +393,65 @@ SUBROUTINE create_multiple_walkers_section(section,error)
TYPE(section_type), POINTER :: subsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="MULTIPLE_WALKERS",&
description="Enables and configures the metadynamics using multiple walkers.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection,keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Controls the usage of the multiple walkers in a metadynamics run.",&
- usage="&MULTIPLE_WALKERS T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="&MULTIPLE_WALKERS T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WALKER_ID",&
description="Sets the walker ID for the local metadynamics run.",&
- usage="WALKER_ID ",type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WALKER_ID ",type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUMBER_OF_WALKERS",&
description="Sets the total number of walkers in the metadynamic run.",&
- usage="NUMBER_OF_WALKERS ",type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NUMBER_OF_WALKERS ",type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WALKER_COMM_FREQUENCY",&
description="Sets the frequency (in unit of spawned hills) for the "//&
"communication between the several walkers, in order to update the "//&
"local list of hills with the ones coming from the other walkers",&
- usage="WALKER_COMM_FREQUENCY ",default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WALKER_COMM_FREQUENCY ",default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WALKERS_STATUS",&
description="Stores the status of the several walkers in the local run.",&
- usage="WALKERS_STATUS .. ",type_of_var=integer_t,n_var=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WALKERS_STATUS .. ",type_of_var=integer_t,n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="WALKERS_FILE_NAME",&
description="Specify the basename for the NUMBER_OF_WALKERS files used to "//&
"communicate between the walkers. Absolute path can be input as well "//&
"together with the filename. One file will be created for each spawned hill.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specified the communication filename for each walker.",repeats=.TRUE.,&
- usage="{String}", type_of_var=lchar_t, n_var=1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ usage="{String}", type_of_var=lchar_t, n_var=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_multiple_walkers_section
! *****************************************************************************
!> \brief creates the alchemical section for free energy evaluation
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teodoro laino [tlaino] 04.2007
! *****************************************************************************
- SUBROUTINE create_ac_section(section,error)
+ SUBROUTINE create_ac_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ac_section', &
routineP = moduleN//':'//routineN
@@ -486,53 +461,49 @@ SUBROUTINE create_ac_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ALCHEMICAL_CHANGE",&
description="Controls the calculation of delta free energies"//&
" with the alchemical change method.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="PARAMETER",&
description="Defines the perturbing parameter of the alchemical change tranformation",&
usage="PARAMETERS k", type_of_var=char_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WEIGHTING_FUNCTION",&
description="Specifies the weighting function (umbrella potential, part of the mixing function)",&
usage="WEIGHTING_FUNCTION (E1+E2-LOG(E1/E2))", type_of_var=lchar_t,&
- n_var=1, default_lc_val="0",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_lc_val="0")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CONV",&
description="Set the relative tolerance for the convergence of the free energy derivative",&
usage="EPS_CONV ",&
- default_r_val=1.0E-2_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NEQUIL_STEPS",&
description="Set the number of equilibration steps, skipped to compute averages",&
usage="NEQUIL_STEPS ",&
- default_i_val=0,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ac_section
! *****************************************************************************
!> \brief creates the umbrella integration section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teodoro laino [tlaino] 01.2007
! *****************************************************************************
- SUBROUTINE create_ui_section(section,error)
+ SUBROUTINE create_ui_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ui_section', &
routineP = moduleN//':'//routineN
@@ -541,21 +512,20 @@ SUBROUTINE create_ui_section(section,error)
TYPE(section_type), POINTER :: subsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="umbrella_integration",&
description="Controls the calculation of free energy derivatives"//&
" with the umbrella integration method.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_uvar_conv_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_uvar_conv_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_uvar_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_uvar_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_ui_section
@@ -564,13 +534,10 @@ END SUBROUTINE create_ui_section
!> \brief Creates the velocity section
!> \param section the section to create
!> \param metadyn_section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_metadyn_history(section, metadyn_section, error)
+ SUBROUTINE create_metadyn_history(section, metadyn_section)
TYPE(section_type), POINTER :: section, metadyn_section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_metadyn_history', &
routineP = moduleN//':'//routineN
@@ -580,20 +547,19 @@ SUBROUTINE create_metadyn_history(section, metadyn_section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SPAWNED_HILLS_POS",&
description="The position of the spawned hills during metadynamics."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify the spawned hills",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="SPAWNED_HILLS_SCALE",&
description="The scales of the spawned hills during metadynamics."//&
@@ -602,115 +568,105 @@ SUBROUTINE create_metadyn_history(section, metadyn_section, error)
"in those directions. The latter can be used to combine spawned "//&
"hills from multiple 1D metadynamics runs in one multidimensional "//&
"metadynamics run.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify the spawned hills",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="SPAWNED_HILLS_HEIGHT",&
description="The height of the spawned hills during metadynamics."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify the spawned hills",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="SPAWNED_HILLS_INVDT",&
description="The inverse of the DELTA_T parameter used for Well-Tempered metadynamics."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify the spawned hills",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
!
! Extended Lagrangian
!
CALL section_create(section,name="EXT_LAGRANGE_SS0",&
description="Colvar position within an extended Lagrangian formalism."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specified the positions",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="EXT_LAGRANGE_VVP",&
description="Colvar velocities within an extended Lagrangian formalism."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specified the velocities",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="EXT_LAGRANGE_SS",&
description="Colvar Theta within an extended Lagrangian formalism."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specified the theta",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
CALL section_create(section,name="EXT_LAGRANGE_FS",&
description="Colvar force within an extended Lagrangian formalism."//&
"Used for RESTART.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specified the theta",repeats=.TRUE.,&
- usage="{Real}", type_of_var=real_t, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(metadyn_section, section, error=error)
- CALL section_release(section,error=error)
+ usage="{Real}", type_of_var=real_t, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(metadyn_section, section)
+ CALL section_release(section)
END SUBROUTINE create_metadyn_history
! *****************************************************************************
!> \brief creates the metavar section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_metavar_section(section,error)
+ SUBROUTINE create_metavar_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_metavar_section', &
routineP = moduleN//':'//routineN
@@ -721,33 +677,32 @@ SUBROUTINE create_metavar_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="METAVAR",&
description="This section specify the nature of the collective variables.",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="LAMBDA",&
description="Specifies the lambda parameter of the collective variable in the"//&
" extended lagrangian scheme.",&
- usage="LAMBDA ",unit_str='internal_cp2k',type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LAMBDA ",unit_str='internal_cp2k',type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MASS",&
description="Specifies the mass parameter of the collective variable in the"//&
- " extended lagrangian scheme.",usage="MASS ",unit_str='amu',type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ " extended lagrangian scheme.",usage="MASS ",unit_str='amu',type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GAMMA",&
description="Specifies the friction term in Langevin integration of the collective variable in the"//&
" extended lagrangian scheme.",&
citations=(/VandenCic2006/),&
- usage="GAMMA {real}",type_of_var=real_t,unit_str="fs^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GAMMA {real}",type_of_var=real_t,unit_str="fs^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALE",&
variants=(/"WIDTH"/),&
@@ -755,22 +710,21 @@ SUBROUTINE create_metavar_section(section,error)
"dependent term has the expression: WW * Sum_{j=1}^{nhills} Prod_{k=1}^{ncolvar} "//&
"[EXP[-0.5*((ss-ss0(k,j))/SCALE(k))^2]], "//&
"where ncolvar is the number of defined METAVAR and nhills is the number of spawned hills. ",&
- usage="SCALE ",type_of_var=real_t,unit_str='internal_cp2k',error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALE ",type_of_var=real_t,unit_str='internal_cp2k')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COLVAR",&
description="Specifies the colvar on which to apply metadynamics.",&
- usage="COLVAR {integer}", type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COLVAR {integer}", type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Wall section
NULLIFY(wall_section, subsection)
CALL section_create(wall_section,name="WALL",&
description="Controls the activation of walls on COLVAR during a metadynamic run.",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
CALL keyword_create(keyword, name="TYPE",&
description="Specify the type of wall",&
@@ -782,22 +736,21 @@ SUBROUTINE create_metavar_section(section,error)
"Applies a gaussian potential at the wall position.",&
"No walls are applied."),&
enum_i_vals=(/do_wall_reflective,do_wall_quadratic,do_wall_quartic,do_wall_gaussian,do_wall_none/),&
- default_i_val=do_wall_none,error=error)
- CALL section_add_keyword(wall_section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_wall_none)
+ CALL section_add_keyword(wall_section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POSITION",&
description="Specify the value of the colvar for the wall position",&
usage="POSITION ",unit_str='internal_cp2k',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(wall_section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(wall_section,keyword)
+ CALL keyword_release(keyword)
! Reflective wall
CALL section_create(subsection,name="REFLECTIVE",&
description="Parameters controlling the reflective wall",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="DIRECTION",&
description="Specify the direction of the wall.",&
@@ -805,17 +758,16 @@ SUBROUTINE create_metavar_section(section,error)
enum_c_vals=s2a( "WALL_PLUS","WALL_MINUS"),&
enum_desc=s2a("Wall extends from the position towards larger values of COLVAR",&
"Wall extends from the position towards smaller values of COLVAR"),&
- enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(wall_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(wall_section, subsection)
+ CALL section_release(subsection)
! Quadratic wall
CALL section_create(subsection,name="QUADRATIC",&
description="Parameters controlling the quadratic wall",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="DIRECTION",&
description="Specify the direction of the wall.",&
@@ -823,25 +775,24 @@ SUBROUTINE create_metavar_section(section,error)
enum_c_vals=s2a( "WALL_PLUS","WALL_MINUS"),&
enum_desc=s2a("Wall extends from the position towards larger values of COLVAR",&
"Wall extends from the position towards smaller values of COLVAR"),&
- enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Specify the value of the quadratic potential constant: K*(CV-POS)^2",&
usage="K ",unit_str='hartree',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(wall_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(wall_section, subsection)
+ CALL section_release(subsection)
! Quartic wall
CALL section_create(subsection,name="QUARTIC",&
description="Parameters controlling the quartic wall",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="DIRECTION",&
description="Specify the direction of the wall.",&
@@ -849,45 +800,44 @@ SUBROUTINE create_metavar_section(section,error)
enum_c_vals=s2a( "WALL_PLUS","WALL_MINUS"),&
enum_desc=s2a("Wall extends from the position towards larger values of COLVAR",&
"Wall extends from the position towards smaller values of COLVAR"),&
- enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/do_wall_p,do_wall_m/),default_i_val=do_wall_p)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Specify the value of the quartic potential constant: K*(CV-(POS+/-(1/K^(1/4))))^4",&
usage="K ",unit_str='hartree',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(wall_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(wall_section, subsection)
+ CALL section_release(subsection)
! Gaussian wall
CALL section_create(subsection,name="GAUSSIAN",&
description="Parameters controlling the gaussian wall.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="WW",&
description="Specify the height of the gaussian: WW*e^(-((CV-POS)/sigma)^2)",&
usage="K ",unit_str='hartree',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIGMA",&
description="Specify the width of the gaussian: WW*e^(-((CV-POS)/sigma)^2)",&
usage="SIGMA ",unit_str='internal_cp2k',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(wall_section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(wall_section, subsection)
+ CALL section_release(subsection)
- CALL section_add_subsection(section, wall_section, error=error)
- CALL section_release(wall_section,error=error)
+ CALL section_add_subsection(section, wall_section)
+ CALL section_release(wall_section)
END SUBROUTINE create_metavar_section
@@ -895,13 +845,10 @@ END SUBROUTINE create_metavar_section
! *****************************************************************************
!> \brief creates the uvar section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_uvar_section(section,error)
+ SUBROUTINE create_uvar_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_uvar_section', &
routineP = moduleN//':'//routineN
@@ -911,33 +858,29 @@ SUBROUTINE create_uvar_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="UVAR",&
description="This section specify the nature of the collective variables"//&
" used in computing the free energy.",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="COLVAR",&
description="Specifies the colvar used to compute free energy",&
- usage="COLVAR {integer}", type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COLVAR {integer}", type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_uvar_section
! *****************************************************************************
!> \brief creates the section specifying parameters to control the convergence
!> of the free energy
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teodoro laino [tlaino] 01.2007
! *****************************************************************************
- SUBROUTINE create_uvar_conv_section(section,error)
+ SUBROUTINE create_uvar_conv_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_uvar_conv_section', &
routineP = moduleN//':'//routineN
@@ -947,66 +890,65 @@ SUBROUTINE create_uvar_conv_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="CONVERGENCE_CONTROL",&
description="This section specify parameters controlling the convergence"//&
" of the free energy.",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="COARSE_GRAINED_WIDTH",&
variants=(/"CG_WIDTH"/),&
description="Width of segments in MD steps to generate the set of"//&
" coarse grained data, providing a correlation independent data set.",&
- usage="COARSE_GRAINED_WIDTH ", default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COARSE_GRAINED_WIDTH ", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_COARSE_GRAINED_WIDTH",&
variants=(/"MAX_CG_WIDTH"/),&
description="Max Width of segments in MD steps to generate the set of"//&
" coarse grained data.",&
- usage="MAX_COARSE_GRAINED_WIDTH ", default_i_val=200,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_COARSE_GRAINED_WIDTH ", default_i_val=200)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COARSE_GRAINED_POINTS",&
variants=(/"CG_POINTS"/),&
description="Set the minimum amount of coarse grained points to collect"//&
" before starting the statistical analysis",&
- usage="COARSE_GRAINED_POINTS ", default_i_val=30,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COARSE_GRAINED_POINTS ", default_i_val=30)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CONV",&
description="Set the relative tolerance for the convergence of the collective"//&
" variable averages used to compute the free energy.",&
usage="EPS_CONV ",&
- default_r_val=1.0E-2_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K_CONFIDENCE_LIMIT",&
description="Set the confidence limit for the Mann-Kendall trend test.",&
usage="K_CONFIDENCE_LIMIT ",&
- default_r_val=0.90_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.90_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SW_CONFIDENCE_LIMIT",&
description="Set the confidence limit for the Shapiro-Wilks normality test.",&
usage="SW_CONFIDENCE_LIMIT ",&
- default_r_val=0.90_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.90_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VN_CONFIDENCE_LIMIT",&
description="Set the confidence limit for the Von Neumann serial correlation test.",&
usage="VN_CONFIDENCE_LIMIT ",&
- default_r_val=0.90_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.90_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_uvar_conv_section
END MODULE input_cp2k_free_energy
diff --git a/src/input_cp2k_global.F b/src/input_cp2k_global.F
index 74b37e4315..87e0d6b06b 100644
--- a/src/input_cp2k_global.F
+++ b/src/input_cp2k_global.F
@@ -72,13 +72,10 @@ MODULE input_cp2k_global
! *****************************************************************************
!> \brief section to hold global settings for the whole program
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_global_section(section,error)
+ SUBROUTINE create_global_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_global_section', &
routineP = moduleN//':'//routineN
@@ -89,12 +86,11 @@ SUBROUTINE create_global_section(section,error)
failure=.FALSE.
NULLIFY(print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="GLOBAL",&
description="Section with general information regarding which kind "//&
"of simulation to perform an parameters for the whole PROGRAM",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="BLACS_GRID",&
@@ -103,17 +99,17 @@ SUBROUTINE create_global_section(section,error)
default_i_val=BLACS_GRID_SQUARE,enum_c_vals=s2a("SQUARE","ROW","COLUMN"),&
enum_desc=s2a("Distribution by matrix blocks", "Distribution by matrix rows",&
"Distribution by matrix columns"), &
- enum_i_vals=(/BLACS_GRID_SQUARE,BLACS_GRID_ROW,BLACS_GRID_COL/), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/BLACS_GRID_SQUARE,BLACS_GRID_ROW,BLACS_GRID_COL/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BLACS_REPEATABLE",&
description="Use a topology for BLACS collectives that is guaranteed to be repeatable "//&
"on homegeneous architectures",&
usage="BLACS_REPEATABLE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PREFERRED_DIAG_LIBRARY",&
description="Specifies the DIAGONALIZATION library to be used. If not availabe, the standard scalapack is used",&
@@ -121,10 +117,9 @@ SUBROUTINE create_global_section(section,error)
default_i_val=do_diag_sl, &
enum_i_vals=(/do_diag_sl,do_diag_sl2,do_diag_elpa/),&
enum_c_vals=s2a("SL","SL2","ELPA"),&
- enum_desc=s2a("Standard scalapack: syevd","Scalapack 2.0: syevr","ELPA"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_desc=s2a("Standard scalapack: syevd","Scalapack 2.0: syevr","ELPA"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ELPA_KERNEL",&
description="Specifies the kernel to be used when ELPA is in use",&
@@ -135,10 +130,9 @@ SUBROUTINE create_global_section(section,error)
enum_desc=s2a("Generic kernel","Simplified generic kernel","Kernel optimized for IBM BGP","Kernel optimized for IBM BGQ",&
"Kernel wiwth assembler for SSE vectorization","Kernel optimized for x86_64 using SSE2/SSE3 (Intel)",&
"Kernel optimized for x86_64 using SSE2/SSE4 (AMD Bulldozer) ",&
- "Kernel optimized for x86_64 using SSE2/SSE4 (block6)"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Kernel optimized for x86_64 using SSE2/SSE4 (block6)"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PREFERRED_FFT_LIBRARY",&
@@ -159,10 +153,9 @@ SUBROUTINE create_global_section(section,error)
"will be used in case a FFT lib is specified and not available",&
"a fast portable FFT library. Recommended."//&
"See also the FFTW_PLAN_TYPE, and FFTW_WISDOM_FILE_NAME keywords.",&
- "Same as FFTW3 (for compatability with CP2K 2.3)"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Same as FFTW3 (for compatability with CP2K 2.3)"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FFTW_WISDOM_FILE_NAME",&
description="The name of the file that contains wisdom (pre-planned FFTs) for use with FFTW3. "//&
@@ -171,10 +164,9 @@ SUBROUTINE create_global_section(section,error)
"Wisdom can be generated using the fftw-wisdom tool that is part of the fftw installation. "//&
"cp2k/tools/cp2k-wisdom is a script that contains some additional info, and can help "//&
"to generate a useful default for /etc/fftw/wisdom or particular values for a given simulation.",&
- usage="FFTW_WISDOM_FILE_NAME wisdom.dat", default_lc_val="/etc/fftw/wisdom", &
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FFTW_WISDOM_FILE_NAME wisdom.dat", default_lc_val="/etc/fftw/wisdom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FFTW_PLAN_TYPE",&
description="FFTW can have improved performance if it is allowed to plan with "//&
@@ -194,10 +186,9 @@ SUBROUTINE create_global_section(section,error)
enum_desc=s2a("Quick estimate, no runtime measurements.",&
"Quick measurement, somewhat faster FFTs.",&
"Measurements trying a wider range of possibilities.",&
- "Measurements trying all possibilities - use with caution."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Measurements trying all possibilities - use with caution."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTENDED_FFT_LENGTHS",&
description="Use fft library specific values for the allows number of points in FFTs. "//&
@@ -210,22 +201,22 @@ SUBROUTINE create_global_section(section,error)
"A change of FFT library must therefore be considered equivalent to a change of basis, "//&
"which implies a change of total energy. ",&
usage="EXTENDED_FFT_LENGTHS",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="FFT_POOL_SCRATCH_LIMIT",&
description="Limits the memory usage of the FFT scratch pool, potentially reducing efficiency a bit",&
- usage="FFT_POOL_SCRATCH_LIMIT ",default_i_val=15,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FFT_POOL_SCRATCH_LIMIT ",default_i_val=15)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALLTOALL_SGL",&
description="All-to-all communication (FFT) should use single precision",&
usage="ALLTOALL_SGL YES",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRINT_LEVEL",&
variants=(/"IOLEVEL"/),&
@@ -237,9 +228,9 @@ SUBROUTINE create_global_section(section,error)
"Little output", "Quite some output", "Lots of output",&
"Everything is written out, useful for debugging purposes only"),&
enum_i_vals=(/silent_print_level,low_print_level,medium_print_level,&
- high_print_level,debug_print_level/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ high_print_level,debug_print_level/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PROGRAM_NAME",&
variants=(/"PROGRAM"/),&
@@ -258,26 +249,26 @@ SUBROUTINE create_global_section(section,error)
"Runs swarm based calculation"),&
enum_i_vals=(/do_atom, do_farming, do_test, do_cp2k, do_optimize_input,&
do_opt_basis, do_tree_mc, do_tree_mc_ana, do_swarm/),&
- default_i_val=do_cp2k, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_cp2k)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PROJECT_NAME",&
variants=(/"PROJECT"/),&
description="Name of the project (used to build the name of the "//&
"trajectory, and other files generated by the program)",&
usage="PROJECT_NAME ",&
- default_c_val="PROJECT",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="PROJECT")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OUTPUT_FILE_NAME",&
description="Name of the output file. "//&
"Relevant only if automatically started (through farming for example). "//&
"If empty uses the project name as basis for it.",&
- usage="OUTPUT_FILE_NAME {filename}",default_lc_val="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="OUTPUT_FILE_NAME {filename}",default_lc_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RUN_TYPE",&
description="Type of run that you want to perform Geometry "//&
@@ -306,67 +297,63 @@ SUBROUTINE create_global_section(section,error)
"Ehrenfest dynamics (using real time propagation of the wavefunction)",&
"Temperature Accelerated Monte Carlo (TAMC)",&
"Tree Monte Carlo (TMC), a pre-sampling MC algorithm",&
- "i-PI driver mode"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "i-PI driver mode"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WALLTIME",&
variants=(/"WALLTI"/),&
description="Maximum execution time for this run. Time in seconds or in HH:MM:SS.",&
- usage="WALLTIME {real} or {HH:MM:SS}", default_lc_val="", &
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="WALLTIME {real} or {HH:MM:SS}", default_lc_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ECHO_INPUT",&
description="If the input should be echoed to the output with all the "//&
"defaults made explicit",&
- usage="ECHO_INPUT NO",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ECHO_INPUT NO",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ECHO_ALL_HOSTS",&
description="Echo a list of hostname and pid for all MPI processes.",&
- usage="ECHO_ALL_HOSTS NO",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ECHO_ALL_HOSTS NO",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRACE",&
description="If a debug trace of the execution of the program should be written ",&
usage="TRACE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRACE_MASTER",&
description="For parallel TRACEd runs: only the master node writes output.",&
usage="TRACE_MASTER",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRACE_MAX",&
description="Limit the total number a given subroutine is printed in the trace. Accounting is not influenced.",&
- usage="TRACE_MAX 100",default_i_val=HUGE(0),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TRACE_MAX 100",default_i_val=HUGE(0))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRACE_ROUTINES",&
description="A list of routines to trace. If left empty all routines are traced. Accounting is not influenced.",&
usage="TRACE_ROUTINES {routine_name1} {routine_name2} ...", type_of_var=char_t,&
- n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FLUSH_SHOULD_FLUSH",&
description="Flush output regularly, enabling this option might degrade performance significantly on certain machines.",&
usage="FLUSH_SHOULD_FLUSH",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CALLGRAPH",&
@@ -379,147 +366,138 @@ SUBROUTINE create_global_section(section,error)
enum_desc=s2a("No callgraph gets written",&
"Only the master process writes his callgraph",&
"All processes write their callgraph (into a separate files)."), &
- enum_i_vals=(/CALLGRAPH_NONE, CALLGRAPH_MASTER, CALLGRAPH_ALL/), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/CALLGRAPH_NONE, CALLGRAPH_MASTER, CALLGRAPH_ALL/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CALLGRAPH_FILE_NAME",&
description="Name of the callgraph file, which is writte a the end of the run. "//&
"If not specified the project name will be used as filename.",&
- usage="CALLGRAPH_FILE_NAME {filename}",default_lc_val="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CALLGRAPH_FILE_NAME {filename}",default_lc_val="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SEED",&
description="Initial seed for the global (pseudo)random number "//&
"generator to create a stream of normally Gaussian "//&
"distributed random numbers.",&
- usage="SEED ",default_i_val=2000,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SEED ",default_i_val=2000)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SAVE_MEM",&
description="Some sections of the input structure are deallocated when not needed,"//&
" and reallocated only when used. This reduces the required maximum memory ",&
usage="SAVE_MEM",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key, "TIMINGS", description=&
"Controls the printing of the timing report at the end of CP2K execution", &
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword,name="THRESHOLD",&
description="Specify % of CPUTIME above which the contribution will be inserted in the"//&
" final timing report (e.g. 0.02 = 2%)",&
usage="THRESHOLD ",&
- default_r_val=0.02_dp, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.02_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SORT_BY_SELF_TIME",&
description="Sort the final timing report by the average self (exclusive) time instead of the "//&
"total (inclusive) time of a routine",&
usage="SORT_BY_SELF_TIME on",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="TIME_MPI",&
description="Include message_passing calls in the timing report (useful with CALLGRAPH).",&
usage="TIME_MPI .TRUE.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "REFERENCES", description=&
"Controls the printing of the references relevant to the calculations performed", &
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="controls the printing of initialization controlled by the global section",&
- print_level=silent_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "PRINT", description=&
"controls the printing of physical and mathematical constants", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword,"BASIC_DATA_TYPES",&
description="Controls the printing of the basic data types.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"physcon",&
description="if the printkey is active prints the physical constants",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"spherical_harmonics",&
description="if the printkey is active prints the spherical harmonics",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"RNG_MATRICES",&
description="Prints the transformation matrices used by the "//&
" random number generator",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"RNG_CHECK",&
description="Performs a check of the global (pseudo)random "//&
"number generator (RNG) and prints the result",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"GLOBAL_GAUSSIAN_RNG",&
description="Prints the initial status of the global Gaussian "//&
"(pseudo)random number stream which is mostly used for "//&
"the velocity initialization",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
NULLIFY(sub_section)
! FM section
- CALL create_fm_section(sub_section,error)
- CALL section_add_subsection(section,sub_section,error=error)
- CALL section_release(sub_section,error=error)
+ CALL create_fm_section(sub_section)
+ CALL section_add_subsection(section,sub_section)
+ CALL section_release(sub_section)
! DBCSR options
- CALL create_dbcsr_section(sub_section,error)
- CALL section_add_subsection(section,sub_section,error=error)
- CALL section_release(sub_section,error=error)
+ CALL create_dbcsr_section(sub_section)
+ CALL section_add_subsection(section,sub_section)
+ CALL section_release(sub_section)
END SUBROUTINE create_global_section
! *****************************************************************************
!> \brief Creates the dbcsr section for configuring DBCSR
!> \param section ...
-!> \param error ...
!> \date 2011-04-05
!> \author Urban Borstnik
! *****************************************************************************
- SUBROUTINE create_dbcsr_section(section,error)
+ SUBROUTINE create_dbcsr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dbcsr_section', &
routineP = moduleN//':'//routineN
@@ -530,11 +508,11 @@ SUBROUTINE create_dbcsr_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DBCSR",&
description="Configuration options for the DBCSR library.",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Borstnik2014/), error=error)
+ citations=(/Borstnik2014/))
NULLIFY (keyword)
!
@@ -542,9 +520,9 @@ SUBROUTINE create_dbcsr_section(section,error)
description="Size of multiplication parameter stack."&
//" A negative value leaves the decision up to DBCSR.",&
usage="mm_stack_size 1000",&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="mm_driver",&
description="Select which routines to use "//&
@@ -559,10 +537,9 @@ SUBROUTINE create_dbcsr_section(section,error)
"Fortran MATMUL",&
"Library optimised for Small Matrix Multiplies "//&
"(requires the SMM library at link time)",&
- "ACC (requires an accelerator backend)"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "ACC (requires an accelerator backend)"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="avg_elements_images",&
description="Average number of elements (dense limit)" &
@@ -571,16 +548,16 @@ SUBROUTINE create_dbcsr_section(section,error)
// " during the operations." &
// " A negative or zero value means unlimited.",&
usage="avg_elements_images 10000",&
- default_i_val=dbcsr_get_conf_avg_elements_images(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=dbcsr_get_conf_avg_elements_images())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="randmat_seed",&
description="Seed value used to create random matrices in testing",&
usage="randmat_seed 3141592",&
- default_i_val=dbcsr_get_conf_randmat_seed(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=dbcsr_get_conf_randmat_seed())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="use_mpi_filtering",&
description="Use filtering for MPI communications" &
@@ -588,9 +565,9 @@ SUBROUTINE create_dbcsr_section(section,error)
// " the number of elements exchanged between MPI processes" &
// " during the operations.",&
usage="use_mpi_filtering F",&
- default_l_val=dbcsr_get_conf_use_mpi_filtering(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=dbcsr_get_conf_use_mpi_filtering())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="use_mpi_rma",&
description="Use RMA for MPI communications" &
@@ -598,18 +575,18 @@ SUBROUTINE create_dbcsr_section(section,error)
// " the number of elements exchanged between MPI processes" &
// " during the operations.",&
usage="use_mpi_rma F",&
- default_l_val=dbcsr_get_conf_use_mpi_rma(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=dbcsr_get_conf_use_mpi_rma())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="n_size_mnk_stacks",&
description="Number of stacks to use for distinct atomic sizes" &
// " (e.g., 2 for a system of mostly waters). "&
//"A negative value leaves the decision up to DBCSR.",&
usage="n_size_mnk_stacks 2",&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="use_comm_thread",&
description="During multiplication, use a thread to periodically poll" &
@@ -617,16 +594,16 @@ SUBROUTINE create_dbcsr_section(section,error)
// " beneficial on systems without a DMA-capable network adapter" &
// " e.g. Cray XE6.",&
usage="use_comm_thread T",&
- default_l_val=dbcsr_get_conf_use_comm_thread(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=dbcsr_get_conf_use_comm_thread())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="MAX_ELEMENTS_PER_BLOCK",&
description="Default block size for turning dense matrices in blocked ones",&
usage="MAX_ELEMENTS_PER_BLOCK 32",&
- default_i_val=dbcsr_get_conf_max_ele_block(),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=dbcsr_get_conf_max_ele_block())
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="comm_thread_load",&
description="If a communications thread is used, specify how much " &
@@ -634,106 +611,103 @@ SUBROUTINE create_dbcsr_section(section,error)
// "addition to communication tasks. "&
// "A negative value leaves the decision up to DBCSR.",&
usage="comm_thread_load 50",&
- default_i_val=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="multrec_limit",&
description="Recursion limit of cache oblivious multrec algorithm.",&
- default_i_val=multrec_limit,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=multrec_limit)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!---------------------------------------------------------------------------
NULLIFY(subsection)
CALL section_create(subsection,name="ACC",&
description="Configuration options for the ACC-Driver.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="priority_buffers",&
description="Number of transfer-buffers associated with high priority streams.",&
- default_i_val=accdrv_priority_buffers,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_priority_buffers)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="posterior_buffers",&
description="Number of transfer-buffers associated with low priority streams.",&
- default_i_val=accdrv_posterior_buffers,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_posterior_buffers)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="priority_streams",&
description="Number of acc streams created with high priority.",&
- default_i_val=accdrv_priority_streams,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_priority_streams)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="posterior_streams",&
description="Number of acc streams created with low priority.",&
- default_i_val=accdrv_posterior_streams,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_posterior_streams)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="avoid_after_busy",&
description="If enabled, stacks are not processed by the acc-driver "&
//"after it has signaled congestion during a round of flushing. "&
//"For the next round of flusing the driver is used again.",&
- default_l_val=accdrv_avoid_after_busy,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=accdrv_avoid_after_busy)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="min_flop_process",&
description="Only process stacks with more than the given number of "&
//"floating-point operations per stack-entry (2*m*n*k).",&
- default_i_val=accdrv_min_flop_process,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_min_flop_process)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="min_flop_sort",&
description="Only sort stacks with more than the given number of "&
//"floating-point operations per stack-entry (2*m*n*k). "&
//"Alternatively, the stacks are roughly ordered through a "&
//"binning-scheme by Peter Messmer.",&
- default_i_val=accdrv_min_flop_sort,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_min_flop_sort)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="process_inhomogenous",&
description="If enabled, inhomogenous stacks are also processed by the acc driver.",&
- default_l_val=accdrv_do_inhomogenous,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=accdrv_do_inhomogenous)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="binning_nbins",&
description="Number of bins used when ordering "&
//"the stacks with the binning-scheme.",&
- default_i_val=accdrv_binning_nbins,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_binning_nbins)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="binning_binsize",&
description="Size of bins used when ordering "&
//"the stacks with the binning-scheme.",&
- default_i_val=accdrv_binning_binsize,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=accdrv_binning_binsize)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection,error=error)
- CALL section_release(subsection, error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
!
END SUBROUTINE create_dbcsr_section
! *****************************************************************************
!> \brief Creates the dbcsr section for configuring FM
!> \param section ...
-!> \param error ...
!> \date 2011-04-05
!> \author Florian Schiffmann
! *****************************************************************************
- SUBROUTINE create_fm_section(section,error)
+ SUBROUTINE create_fm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_fm_section', &
routineP = moduleN//':'//routineN
@@ -741,35 +715,34 @@ SUBROUTINE create_fm_section(section,error)
LOGICAL :: failure
TYPE(keyword_type), POINTER :: keyword
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="FM",&
description="Configuration options for the full matrices.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY (keyword)
CALL keyword_create(keyword, name="NROW_BLOCKS",&
description="Defines the number of rows per scalapack block in "//&
"the creation of block cyclic dense matrices ",&
- default_i_val=32,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=32)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NCOL_BLOCKS",&
description="Defines the number of columns per scalapack block in "//&
"the creation of vlock cyclic dense matrices ",&
- default_i_val=32,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=32)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FORCE_BLOCK_SIZE",&
description="Ensure for small matrices that the layout is compatible "//&
"with bigger ones, i.e. no subdivision is performed (can break LAPACK!!!).",&
usage="FORCE_BLOCK_SIZE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE_OF_MATRIX_MULTIPLICATION",&
description="Allows to switch between scalapack pdgemm and dbcsr_multiply. "//&
@@ -782,10 +755,9 @@ SUBROUTINE create_fm_section(section,error)
enum_i_vals=(/do_pdgemm,do_dbcsr/),&
enum_c_vals=s2a("PDGEMM","DBCSR_MM"),&
enum_desc=s2a("Standard scalapack: pdgemm",&
- "DBCSR_MM is employed. This needs local transformation of the matrices"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "DBCSR_MM is employed. This needs local transformation of the matrices"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
END SUBROUTINE create_fm_section
diff --git a/src/input_cp2k_hfx.F b/src/input_cp2k_hfx.F
index ace74d7b29..4b31cb1a42 100644
--- a/src/input_cp2k_hfx.F
+++ b/src/input_cp2k_hfx.F
@@ -46,13 +46,10 @@ MODULE input_cp2k_hfx
! *****************************************************************************
!> \brief creates the input section for the hf part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hfx_section(section,error)
+ SUBROUTINE create_hfx_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hfx_section', &
routineP = moduleN//':'//routineN
@@ -63,12 +60,11 @@ SUBROUTINE create_hfx_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"HF",&
description="Sets up the Hartree-Fock parameters if requested ",&
n_keywords=5, n_subsections=2, repeats=.TRUE., &
- citations=(/Guidon2008,Guidon2009/),&
- error=error)
+ citations=(/Guidon2008,Guidon2009/))
NULLIFY(keyword, print_key, subsection)
@@ -77,59 +73,58 @@ SUBROUTINE create_hfx_section(section,error)
"1.0 implies standard Hartree-Fock if used with XC_FUNCTIONAL NONE. "//&
"NOTE: In a mixed potential calculation this should be set to 1.0, otherwise "//&
"all parts are multiplied with this factor. ",&
- usage="FRACTION 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FRACTION 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TREAT_LSD_IN_CORE",&
description="Determines how spin denisities are taken into account. "//&
"If true, the beta spin density is included via a second in core call. "//&
"If false, alpha and beta spins are done in one shot ",&
- usage="TREAT_LSD_IN_CORE TRUE", default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TREAT_LSD_IN_CORE TRUE", default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PW_HFX",&
description="Compute the Hartree-Fock energy also in the plane wave basis."//&
"The value is ignored, and intended for debugging only.",&
- usage="PW_HFX FALSE", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PW_HFX FALSE", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PW_HFX_BLOCKSIZE",&
description="Improve the performance of pw_hfx at the cost of some additional memory "//&
"by storing the realspace representation of PW_HFX_BLOCKSIZE states.",&
- usage="PW_HFX_BLOCKSIZE 20", default_i_val=20,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PW_HFX_BLOCKSIZE 20", default_i_val=20)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"HF_INFO",&
description="Controls the printing basic info about hf method", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_hf_pbc_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hf_pbc_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_hf_screening_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hf_screening_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_hf_potential_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hf_potential_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_hf_load_balance_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hf_load_balance_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_hf_memory_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hf_memory_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_hfx_section
@@ -139,13 +134,10 @@ END SUBROUTINE create_hfx_section
!>
!> creates the input section for the hf potential part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hf_load_balance_section(section,error)
+ SUBROUTINE create_hf_load_balance_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_hf_load_balance_section', &
@@ -157,12 +149,11 @@ SUBROUTINE create_hf_load_balance_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"LOAD_BALANCE",&
description="Parameters influencing the load balancing of the HF",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/guidon2008/),&
- error=error)
+ citations=(/guidon2008/))
NULLIFY(keyword)
CALL keyword_create(&
@@ -170,10 +161,9 @@ SUBROUTINE create_hf_load_balance_section(section,error)
name="NBINS",&
description="Number of bins per process used to group atom quartets.",&
usage="NBINS 32",&
- default_i_val=64,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=64)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -181,10 +171,9 @@ SUBROUTINE create_hf_load_balance_section(section,error)
description="Determines the blocking used for the atomic quartet loops. "//&
"A proper choice can speedup the calculation. The default (-1) is automatic.",&
usage="BLOCK_SIZE 4",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(&
@@ -194,29 +183,26 @@ SUBROUTINE create_hf_load_balance_section(section,error)
"For highly ordered input structures with a bad load balance, setting "//&
"this flag to TRUE might improve.", &
usage="RANDOMIZE TRUE",&
- default_l_val=.FALSE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PRINT",&
description="Controls the printing of info about load balance", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
- CALL keyword_release(keyword,error=error)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,&
name="LOAD_BALANCE_INFO",&
description="Activates the printing of load balance information ",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_release(print_key,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_release(print_key)
END SUBROUTINE create_hf_load_balance_section
@@ -226,13 +212,10 @@ END SUBROUTINE create_hf_load_balance_section
!>
!> creates the input section for the hf potential part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hf_potential_section(section,error)
+ SUBROUTINE create_hf_potential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hf_potential_section', &
routineP = moduleN//':'//routineN
@@ -242,12 +225,11 @@ SUBROUTINE create_hf_potential_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"INTERACTION_POTENTIAL",&
description="Sets up interaction potential if requested ",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/guidon2008,guidon2009/),&
- error=error)
+ citations=(/guidon2008,guidon2009/))
NULLIFY(keyword)
CALL keyword_create(&
@@ -270,9 +252,9 @@ SUBROUTINE create_hf_potential_section(section,error)
"Overlap",&
"Truncated coulomb potential: if (r < R_c) 1/r else 0",&
"Truncated Mix coulomb and longrange potential, assumes/requires that the erf has fully decayed at R_c"),&
- default_i_val=do_hfx_potential_coulomb, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_hfx_potential_coulomb)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(&
@@ -280,39 +262,38 @@ SUBROUTINE create_hf_potential_section(section,error)
name="OMEGA",&
description="Parameter for short/longrange interaction",&
usage="OMEGA 0.5",&
- default_r_val=0.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALE_COULOMB",&
description="Scales Hartree-Fock contribution arising from a coulomb potential. "//&
"Only valid when doing a mixed potential calculation",&
- usage="SCALE_COULOMB 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALE_COULOMB 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALE_LONGRANGE",&
description="Scales Hartree-Fock contribution arising from a longrange potential. "//&
"Only valid when doing a mixed potential calculation",&
- usage="SCALE_LONGRANGE 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALE_LONGRANGE 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALE_GAUSSIAN",&
description="Scales Hartree-Fock contribution arising from a gaussian potential. "//&
"Only valid when doing a mixed potential calculation",&
- usage="SCALE_GAUSSIAN 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCALE_GAUSSIAN 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CUTOFF_RADIUS",&
description="Determines cutoff radius for the truncated 1/r potential. "//&
"Only valid when doing truncated calculation",&
usage="CUTOFF_RADIUS 10.0",type_of_var=real_t,&! default_r_val=10.0_dp,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -320,10 +301,9 @@ SUBROUTINE create_hf_potential_section(section,error)
description="Location of the file t_c_g.dat that contains the data for the "//&
"evaluation of the truncated gamma function ",&
usage="T_C_G_DATA /data/t_c_g.dat",&
- default_c_val="t_c_g.dat",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="t_c_g.dat")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_hf_potential_section
@@ -333,13 +313,10 @@ END SUBROUTINE create_hf_potential_section
! *****************************************************************************
!> \brief creates the input section for the hf screening part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hf_screening_section(section,error)
+ SUBROUTINE create_hf_screening_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hf_screening_section', &
routineP = moduleN//':'//routineN
@@ -349,12 +326,11 @@ SUBROUTINE create_hf_screening_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"SCREENING",&
description="Sets up screening parameters if requested ",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/guidon2008,guidon2009/),&
- error=error)
+ citations=(/guidon2008,guidon2009/))
NULLIFY(keyword)
CALL keyword_create(&
@@ -364,10 +340,9 @@ SUBROUTINE create_hf_screening_section(section,error)
"integrals using the Schwarz inequality for the given "//&
"threshold.",&
usage="EPS_SCHWARZ 1.0E-6",&
- default_r_val=1.0E-10_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(&
@@ -378,10 +353,9 @@ SUBROUTINE create_hf_screening_section(section,error)
"threshold. This will be approximately the accuracy of the forces, "//&
" and should normally be similar to EPS_SCF",&
usage="EPS_SCHWARZ_FORCES 1.0E-5",&
- default_r_val=1.0E-6_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(&
@@ -392,40 +366,36 @@ SUBROUTINE create_hf_screening_section(section,error)
"This results in a significant speedup for large systems, "//&
"but might require a somewhat tigher EPS_SCHWARZ_FORCES.", &
usage="SCREEN_P_FORCES TRUE",&
- default_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(keyword, name="SCREEN_ON_INITIAL_P",&
description="Screen on an initial density matrix. For the first MD step"//&
" this matrix must be provided by a Restart File.",&
- usage="SCREEN_ON_INITIAL_P TRUE", default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SCREEN_ON_INITIAL_P TRUE", default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(keyword)
CALL keyword_create(keyword, name="P_SCREEN_CORRECTION_FACTOR",&
description="Recalculates integrals on the fly if the actual density matrix is"//&
" larger by a given factor than the initial one. If the factor is set"//&
" to 0.0_dp, this feature is disabled.",&
- usage="P_SCREEN_CORRECTION_FACTOR 0.0_dp", default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="P_SCREEN_CORRECTION_FACTOR 0.0_dp", default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_hf_screening_section
! *****************************************************************************
!> \brief creates the input section for the hf-pbc part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hf_pbc_section(section,error)
+ SUBROUTINE create_hf_pbc_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hf_pbc_section', &
routineP = moduleN//':'//routineN
@@ -435,12 +405,11 @@ SUBROUTINE create_hf_pbc_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"PERIODIC",&
description="Sets up periodic boundary condition parameters if requested ",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/guidon2008,guidon2009/),&
- error=error)
+ citations=(/guidon2008,guidon2009/))
NULLIFY(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -450,10 +419,9 @@ SUBROUTINE create_hf_pbc_section(section,error)
"This algorithm might be to conservative, resulting in some overhead. "//&
"You can try to adjust this number in order to make a calculation cheaper. ", &
usage="NUMBER_OF_SHELLS 2",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_hf_pbc_section
@@ -461,13 +429,10 @@ END SUBROUTINE create_hf_pbc_section
! *****************************************************************************
!> \brief creates the input section for the hf-memory part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Manuel Guidon
! *****************************************************************************
- SUBROUTINE create_hf_memory_section(section,error)
+ SUBROUTINE create_hf_memory_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_hf_memory_section', &
routineP = moduleN//':'//routineN
@@ -477,12 +442,11 @@ SUBROUTINE create_hf_memory_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"MEMORY",&
description="Sets up memory parameters for the storage of the ERI's if requested ",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/guidon2008/),&
- error=error)
+ citations=(/guidon2008/))
NULLIFY(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -491,10 +455,9 @@ SUBROUTINE create_hf_memory_section(section,error)
description="Scaling factor to scale eps_schwarz. Storage threshold for compression "//&
"will be EPS_SCHWARZ*EPS_STORAGE_SCALING.",&
usage="EPS_STORAGE 1.0E-2",&
- default_r_val=1.0E0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -506,10 +469,9 @@ SUBROUTINE create_hf_memory_section(section,error)
"When running a threaded version, cp2k automatically takes care of "//&
"distributing the memory among all the threads within a process.",&
usage="MAX_MEMORY 256",&
- default_i_val=512,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=512)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -517,10 +479,9 @@ SUBROUTINE create_hf_memory_section(section,error)
description="Loaction where ERI's are stored if MAX_DISK_SPACE /=0 "//&
"Expects a path to a directory. ",&
usage="STORAGE_LOCATION /data/scratch",&
- default_c_val=".",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val=".")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -528,18 +489,17 @@ SUBROUTINE create_hf_memory_section(section,error)
description="Defines the maximum amount of disk space [MiB] used to store precomputed "//&
"compressed four-center integrals. If 0, nothing is stored to disk",&
usage="MAX_DISK_SPACE 256",&
- default_i_val=0,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TREAT_FORCES_IN_CORE",&
description="Determines whether the derivative ERI's should be stored to RAM or not. "//&
"Only meaningful when performing Ehrenfest MD. "//&
"Memory usage is defined via MAX_MEMORY, i.e. the memory is shared wit the energy ERI's.",&
- usage="TREAT_FORCES_IN_CORE TRUE", default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TREAT_FORCES_IN_CORE TRUE", default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_hf_memory_section
diff --git a/src/input_cp2k_kpoints.F b/src/input_cp2k_kpoints.F
index 3b85e6aeb2..a47fc08d93 100644
--- a/src/input_cp2k_kpoints.F
+++ b/src/input_cp2k_kpoints.F
@@ -51,13 +51,10 @@ MODULE input_cp2k_kpoints
!> PARALLEL_GROUP_SIZE [-1,0,n]
!>
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author JGH
! *****************************************************************************
- SUBROUTINE create_kpoints_section(section,error)
+ SUBROUTINE create_kpoints_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_kpoints_section', &
routineP = moduleN//':'//routineN
@@ -67,54 +64,53 @@ SUBROUTINE create_kpoints_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="KPOINTS",&
description="Sets up the kpoints.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY (keyword)
CALL keyword_create(keyword, name="SCHEME",&
description="Kpoint scheme to be used. ",&
usage="SCHEME {KPMETHOD}{integer} {integer} ..",&
- n_var=-1, type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KPOINT",&
description="Specify kpoint coordinates and weight. ",&
usage="KPOINT x y z w",repeats=.TRUE.,&
- n_var=4, type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4, type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SYMMETRY",&
description="Use symmetry to reduce the number of kpoints.",&
usage="SYMMETRY ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FULL_GRID",&
description="Use full non-reduced kpoint grid.",&
usage="FULL_GRID ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VERBOSE",&
description="Verbose output information.",&
usage="VERBOSE ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_GEO",&
description="Accuracy in symmetry determination.",&
usage="EPS_GEO ",&
- default_r_val=1.0e-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARALLEL_GROUP_SIZE",&
description="Number of processors to be used for a single kpoint. "//&
@@ -124,9 +120,9 @@ SUBROUTINE create_kpoints_section(section,error)
" Value=0 (all processes)."//&
" Value=n (exactly n processes).",&
usage="PARALLEL_GROUP_SIZE ",&
- default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WAVEFUNCTIONS",&
description="Use real/complex wavefunctions if possible.",&
@@ -135,9 +131,9 @@ SUBROUTINE create_kpoints_section(section,error)
enum_c_vals=s2a("REAL","COMPLEX"),&
enum_desc=s2a("Use real wavefunctions (if possible by kpoints specified).",&
"Use complex wavefunctions (default)."),&
- enum_i_vals=(/ use_real_wfn, use_complex_wfn/), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ use_real_wfn, use_complex_wfn/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_kpoints_section
diff --git a/src/input_cp2k_ls.F b/src/input_cp2k_ls.F
index 360bcc5061..4cfd0de813 100644
--- a/src/input_cp2k_ls.F
+++ b/src/input_cp2k_ls.F
@@ -48,12 +48,10 @@ MODULE input_cp2k_ls
! *****************************************************************************
!> \brief creates the linear scaling scf section
!> \param section ...
-!> \param error ...
!> \author Joost VandeVondele [2010-10]
! *****************************************************************************
- SUBROUTINE create_ls_scf_section(section,error)
+ SUBROUTINE create_ls_scf_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ls_scf_section', &
routineP = moduleN//':'//routineN
@@ -64,103 +62,103 @@ SUBROUTINE create_ls_scf_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"LS_SCF",&
description="Specifies the parameters of the linear scaling SCF routines",&
n_keywords=24, n_subsections=3, repeats=.FALSE., &
- citations=(/VandeVondele2012/),error=error)
+ citations=(/VandeVondele2012/))
NULLIFY (keyword,subsection)
CALL keyword_create(keyword, name="LS_DIIS",&
description="Perform DIIS within linear scaling SCF",&
usage="LS_DIIS",lone_keyword_l_val=.TRUE.,&
- default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INI_DIIS",&
description="Iteration cycle to start DIIS Kohn-Sham matrix update",&
- usage="INI_DIIS 2", default_i_val=2,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="INI_DIIS 2", default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_DIIS",&
description="Size of LS_DIIS buffer",&
- usage="MAX_DIIS 4", default_i_val=4,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_DIIS 4", default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NMIXING",&
description="Minimal number of density mixing before start DIIS",&
- usage="NMIXING 2", default_i_val=2,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NMIXING 2", default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_DIIS",&
description="Threshold on the convergence to start using DIIS",&
- usage="EPS_DIIS 1.e-1", default_r_val=1.e-1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DIIS 1.e-1", default_r_val=1.e-1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_SCF",&
description="Maximum number of SCF iteration to be performed for one optimization",&
- usage="MAX_SCF 200", default_i_val=20,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_SCF 200", default_i_val=20)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SCF",&
description="Target accuracy for the SCF convergence in terms of change of the total energy per electron.",&
- usage="EPS_SCF 1.e-6", default_r_val=1.e-7_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 1.e-6", default_r_val=1.e-7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIXING_FRACTION",&
description="Mixing density matrices uses the specified fraction in the SCF procedure.",&
- usage="MIXING_FRACTION 0.4", default_r_val=0.45_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MIXING_FRACTION 0.4", default_r_val=0.45_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_FILTER",&
description="Threshold used for filtering matrix operations.",&
- usage="EPS_FILTER 1.0E-7", default_r_val=1.0E-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_FILTER 1.0E-7", default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_LANCZOS",&
description="Threshold used for lanczos estimates.",&
- usage="EPS_LANCZOS 1.0E-4", default_r_val=1.0E-3_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_LANCZOS 1.0E-4", default_r_val=1.0E-3_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER_LANCZOS",&
description="Maximum number of lanczos iterations.",&
- usage="MAX_ITER_LANCZOS ", default_i_val=128,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER_LANCZOS ", default_i_val=128)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU",&
description="Value (or initial guess) for the chemical potential,"//&
" i.e. some suitable energy between HOMO and LUMO energy.",&
- usage="MU 0.0", default_r_val=-0.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MU 0.0", default_r_val=-0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FIXED_MU",&
description="Should the calculation be performed at fixed chemical potential,"//&
" or should it be found fixing the number of electrons",&
- usage="FIXED_MU .TRUE.", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FIXED_MU .TRUE.", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTRAPOLATION_ORDER",&
description="Number of previous matrices used for the ASPC extrapolation of the initial guess. "//&
"0 implies that an atomic guess is used at each step. "//&
"low (1-2) will result in a drift of the constant of motion during MD. "//&
"high (>5) might be somewhat unstable, leading to more SCF iterations.",&
- usage="EXTRAPOLATION_ORDER 3",default_i_val=4, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EXTRAPOLATION_ORDER 3",default_i_val=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="S_PRECONDITIONER",&
description="Preconditions S with some appropriate form.",&
@@ -170,10 +168,9 @@ SUBROUTINE create_ls_scf_section(section,error)
enum_desc=s2a("No preconditioner",&
"Using atomic blocks",&
"Using molecular sub-blocks. Recommended if molecules are defined and not too large."),&
- enum_i_vals=(/ls_s_preconditioner_none, ls_s_preconditioner_atomic, ls_s_preconditioner_molecular/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_s_preconditioner_none, ls_s_preconditioner_atomic, ls_s_preconditioner_molecular/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PURIFICATION_METHOD",&
description="Scheme used to purify the Kohn-Sham matrix into the density matrix.",&
@@ -185,22 +182,21 @@ SUBROUTINE create_ls_scf_section(section,error)
"Trace resetting 4th order scheme",&
"Trace conserving 2nd order scheme",&
"PEXSI method"),&
- enum_i_vals=(/ls_scf_ns, ls_scf_trs4, ls_scf_tc2, ls_scf_pexsi/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_scf_ns, ls_scf_trs4, ls_scf_tc2, ls_scf_pexsi/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DYNAMIC_THRESHOLD",&
description="Should the threshold for the purification be chosen dynamically",&
- usage="DYNAMIC_THRESHOLD .TRUE.", default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DYNAMIC_THRESHOLD .TRUE.", default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NON_MONOTONIC",&
description="Should the purification be performed non-monotonically. Relevant for TC2 only.",&
- usage="NON_MONOTONIC .TRUE.", default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NON_MONOTONIC .TRUE.", default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MATRIX_CLUSTER_TYPE",&
description="Specify how atomic blocks should be clustered in the used matrices, in order to improve flop rate, "//&
@@ -212,29 +208,28 @@ SUBROUTINE create_ls_scf_section(section,error)
enum_c_vals=s2a("ATOMIC", "MOLECULAR"),&
enum_desc=s2a("Using atomic blocks",&
"Using molecular blocks."),&
- enum_i_vals=(/ls_cluster_atomic, ls_cluster_molecular /),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_cluster_atomic, ls_cluster_molecular /))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SINGLE_PRECISION_MATRICES",&
description="Matrices used within the LS code can be either double or single precision.",&
- usage="SINGLE_PRECISION_MATRICES", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SINGLE_PRECISION_MATRICES", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_WRITE",&
description="Write the density matrix at the end of the SCF (currently requires EXTRAPOLATION_ORDER>0). "//&
"Files might be rather large.",&
- usage="RESTART_READ", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESTART_READ", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_READ",&
description="Read the density matrix before the (first) SCF.",&
- usage="RESTART_READ", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESTART_READ", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="S_INVERSION",&
description="Method used to compute the inverse of S.",&
@@ -243,46 +238,44 @@ SUBROUTINE create_ls_scf_section(section,error)
enum_c_vals=s2a("SIGN_SQRT","HOTELLING"),&
enum_desc=s2a("Using the inverse sqrt as obtained from sign function iterations.",&
"Using the Hotellign iteration."),&
- enum_i_vals=(/ls_s_inversion_sign_sqrt,ls_s_inversion_hotelling/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_s_inversion_sign_sqrt,ls_s_inversion_hotelling/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIGN_SQRT_ORDER",&
description="Order of the sqrt iteration, should be 2..5, 3 or 5 recommended",&
usage="SIGN_SQRT_ORDER 5",&
- default_i_val=3,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REPORT_ALL_SPARSITIES",&
description="Run the sparsity report at the end of the SCF",&
- usage="REPORT_ALL_SPARSITIES", default_l_val=.TRUE.,lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="REPORT_ALL_SPARSITIES", default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PERFORM_MU_SCAN",&
description="Do a scan of the chemical potential after the SCF",&
- usage="PERFORM_MU_SCAN", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PERFORM_MU_SCAN", default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_ls_curvy_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ls_curvy_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_chebyshev_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_chebyshev_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_mixing_section(subsection,ls_scf=.TRUE.,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mixing_section(subsection,ls_scf=.TRUE.)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_pexsi_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_pexsi_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_ls_scf_section
@@ -290,12 +283,10 @@ END SUBROUTINE create_ls_scf_section
! *****************************************************************************
!> \brief creates the DOS section
!> \param section ...
-!> \param error ...
!> \author Joost VandeVondele, Jinwoong Cha [2012-10]
! *****************************************************************************
- SUBROUTINE create_chebyshev_section(section,error)
+ SUBROUTINE create_chebyshev_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_chebyshev_section', &
routineP = moduleN//':'//routineN
@@ -306,33 +297,32 @@ SUBROUTINE create_chebyshev_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"CHEBYSHEV",&
description="Specifies the parameters needed for the chebyshev expansion based properties.",&
- n_keywords=24, n_subsections=3, repeats=.FALSE., &
- error=error)
+ n_keywords=24, n_subsections=3, repeats=.FALSE.)
NULLIFY (keyword)
NULLIFY(print_key)
CALL keyword_create(keyword, name="N_CHEBYSHEV",&
description="Order of the polynomial expansion.",&
- usage="N_CHEBYSHEV 2000", default_i_val=500,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="N_CHEBYSHEV 2000", default_i_val=500)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! A DOS print key
CALL cp_print_key_section_create(print_key,"DOS",&
description="Controls the printing of the Density of States (DOS).", &
- print_level=high_print_level,filename="",error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="N_GRIDPOINTS",&
description="Number of points in the computed DOS",&
- usage="N_GRIDPOINTS 10000", default_i_val=2000,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ usage="N_GRIDPOINTS 10000", default_i_val=2000)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
! Energy specific electron density cubes
CALL cp_print_key_section_create(print_key,&
@@ -342,32 +332,32 @@ SUBROUTINE create_chebyshev_section(section,error)
"contributing to the density of states within "//&
"the specific energy range "//&
"(MIN_ENERGY ≤ E ≤ MAX_ENERGY). MIN_ENERGY and MAX_ENERGY need to be specified explicitly.",&
- print_level=high_print_level,filename="",error=error)
+ print_level=high_print_level,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_ENERGY",&
description="Lower bounds of the energy ranges of interest.",&
usage="MIN_ENERGY -1.01 -0.62 0.10 .. ", &
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ENERGY",&
description="Upper bounds of the energy ranges of interest.",&
usage="MAX_ENERGY -0.81 -0.43 0.22 .. ", &
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, print_key, error=error)
- CALL section_release(print_key, error=error)
+ CALL section_add_subsection(section, print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_chebyshev_section
@@ -375,12 +365,10 @@ END SUBROUTINE create_chebyshev_section
! *****************************************************************************
!> \brief creates the curvy_steps section in linear scaling scf
!> \param section ...
-!> \param error ...
!> \author Florian Schiffmann [2012-10]
! *****************************************************************************
- SUBROUTINE create_ls_curvy_section(section,error)
+ SUBROUTINE create_ls_curvy_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ls_curvy_section', &
routineP = moduleN//':'//routineN
@@ -390,12 +378,11 @@ SUBROUTINE create_ls_curvy_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"CURVY_STEPS",&
description="Specifies the parameters of the linear scaling SCF routines",&
n_keywords=24, n_subsections=3, repeats=.FALSE., &
- citations=(/Shao2003/),&
- error=error)
+ citations=(/Shao2003/))
NULLIFY (keyword)
@@ -406,46 +393,45 @@ SUBROUTINE create_ls_curvy_section(section,error)
enum_desc=s2a("Performs a three point line search",&
"Only for spin unrestricted calcualtions. Separate step sizes for alpha and beta spin"//&
" using a fit to a 2D parabolic function"),&
- enum_i_vals=(/ls_scf_line_search_3point,ls_scf_line_search_3point_2d/), error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/ls_scf_line_search_3point,ls_scf_line_search_3point_2d/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_BCH_HISTORY",&
description="Number of stored matrices in the Baker-Campbell-Hausdorff series. "//&
"Reduces the BCH evaluation during line search but can be memory intense. ",&
usage="N_BCH_HISTORY 5",&
- default_i_val=7,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=7)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_HESSIAN_SHIFT",&
description="Minimal eigenvalue shift for the Hessian in the Newton iteration."//&
" Useful for small band gap systems (0.5-1.0 recommended). ",&
- usage="MIN_HESSIAN_SHIFT 0.0", default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MIN_HESSIAN_SHIFT 0.0", default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FILTER_FACTOR",&
description="Allows to set a seperate EPS_FILTER in the newton iterations."//&
" The new EPS is EPS_FILTER*FILTER_FACTOR.",&
- usage="FILTER_FACTOR 10.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FILTER_FACTOR 10.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FILTER_FACTOR_SCALE",&
description="Allows for dynamic EPS_FILTER. Updates the filter factor every SCF-Newton "//&
"step by FILTER_FACTOR=FILTER_FACTOR*FILTER_FACTOR_SCALE",&
- usage="FILTER_FACTOR_SCALE 0.5", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FILTER_FACTOR_SCALE 0.5", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_FILTER",&
description="Lowest EPS_FILTER in dynamic filtering. Given as multiple of EPS_FILTER:"//&
" EPS_FILTER_MIN=EPS_FILTER*MIN_FILTER",&
- usage="FILTER_FACTOR 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="FILTER_FACTOR 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ls_curvy_section
@@ -453,14 +439,12 @@ END SUBROUTINE create_ls_curvy_section
! *****************************************************************************
!> \brief creates the PEXSI library subsection of the linear scaling section.
!> \param section ...
-!> \param error ...
!> \par History
!> 11.2014 created [Patrick Seewald]
!> \author Patrick Seewald
! *****************************************************************************
- SUBROUTINE create_pexsi_section(section, error)
+ SUBROUTINE create_pexsi_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_pexsi_section', &
routineP = moduleN//':'//routineN
@@ -470,7 +454,7 @@ SUBROUTINE create_pexsi_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"PEXSI",&
description="Specifies the parameters of the PEXSI library. The density matrix is calculated "//&
@@ -479,82 +463,82 @@ SUBROUTINE create_pexsi_section(section, error)
"and PEXSI is applicable to insulating and metallic systems. The value of EPS_PGF_ORB "//&
"(in QS input section) defines the sparsity of the matrices sent to PEXSI and EPS_FILTER "//&
"is overwritten with 0.",&
- n_keywords=17, repeats=.FALSE.,citations=(/Lin2009,Lin2013/),error=error)
+ n_keywords=17, repeats=.FALSE.,citations=(/Lin2009,Lin2013/))
NULLIFY (keyword)
CALL keyword_create(keyword, name="TEMPERATURE",&
description="Electronic temperature",&
- default_r_val=cp_unit_to_cp2k(value=300.0_dp, unit_str="K", error=error),&
- unit_str="K", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=300.0_dp, unit_str="K"),&
+ unit_str="K")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GAP",&
description="Spectral gap. Note: This can be set to be 0 in most cases.",&
- default_r_val=0.0_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_POLE",&
description="Number of terms in the pole expansion (should be even).",&
- default_i_val=64,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=64)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="IS_INERTIA_COUNT",&
description="Whether inertia counting is used each time the DFT driver "//&
"of PEXSI is invoked. If FALSE, inertia counting is still used in the "//&
"first SCF iteration.",&
- default_l_val=.FALSE., lone_keyword_l_val = .TRUE. ,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val = .TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_PEXSI_ITER",&
description="Maximum number of PEXSI iterations after each inertia counting procedure.",&
- default_i_val=5,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU_MIN_0",&
description="Initial guess of lower bound for mu.",&
- default_r_val=-5.0_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-5.0_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU_MAX_0",&
description="Initial guess of upper bound for mu.",&
- default_r_val=5.0_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=5.0_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU_INERTIA_TOLERANCE",&
description="Stopping criterion in terms of the chemical potential for the "//&
"inertia counting procedure.",&
- default_r_val=0.01_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.01_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU_INERTIA_EXPANSION",&
description="If the chemical potential is not in the initial interval, "//&
"the interval is expanded by MU_INERTIA_EXPANSION.",&
- default_r_val=0.15_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.15_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MU_PEXSI_SAFE_GUARD",&
description="Safe guard criterion in terms of the chemical potential to "//&
"reinvoke the inertia counting procedure.",&
- default_r_val=0.01_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.01_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_ELECTRON_PEXSI_TOLERANCE",&
description="Stopping criterion of the PEXSI iteration in terms of "//&
"The number of electrons compared to the exact number of electrons. "//&
"This threshold is the target tolerance applied at convergence of SCF.",&
- default_r_val=0.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_ELECTRON_INITIAL_TOLERANCE",&
description="The same as NUM_ELECTRON_PEXSI_TOLERANCE but applied in the first SCF steps. "//&
@@ -563,9 +547,9 @@ SUBROUTINE create_pexsi_section(section, error)
"NUM_ELECTRON_PEXSI_TOLERANCE, the PEXSI tolerance in number of electrons is set adaptively "//&
"according to the SCF convergence error of the previous SCF step. This reduces the number "//&
"of PEXSI iterations in the first SCF steps but leads to at least one more SCF step.",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORDERING",&
description="Ordering strategy for factorization and selected inversion.",&
@@ -573,40 +557,40 @@ SUBROUTINE create_pexsi_section(section, error)
enum_desc=s2a("Parallel ordering using ParMETIS/PT-SCOTCH (PARMETIS option in SuperLU_DIST)",&
"Sequential ordering using METIS (METIS_AT_PLUS_A option in SuperLU_DIST)",&
"Multiple minimum degree ordering (MMD_AT_PLUS_A option in SuperLU_DIST)"),&
- enum_i_vals=(/0,1,2/), default_i_val=0, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/0,1,2/), default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NP_SYMB_FACT",&
description="Number of processors for PARMETIS/PT-SCOTCH. Only used if the ordering == 0. "//&
"If 0, the number of processors for PARMETIS/PT-SCOTCH will be set equal to the number of "//&
"MPI ranks per pole. Note: if more than one processor is used, a segmentation fault may occur in the "//&
"symbolic factorization phase.",&
- default_i_val=1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VERBOSITY",&
description="The level of output information.",&
enum_c_vals=s2a("SILENT","BASIC","DETAILED"),&
- enum_i_vals=(/0,1,2/), default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/0,1,2/), default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_RANKS_PER_POLE",&
description="The minimum number of processors used for each pole. The real "//&
"number of processors per pole is the smallest number greater or equal to "//&
"MIN_RANKS_PER_POLE that divides MPI size without remainder. For efficiency, MIN_RANKS_PER_POLE "//&
"should be a small numbers (limited by the available memory).", &
- default_i_val=64,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=64)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CSR_SCREENING",&
description="Whether distance screening should be applied to improve sparsity of CSR matrices.",&
- default_l_val=.TRUE., lone_keyword_l_val = .TRUE. ,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val = .TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_pexsi_section
diff --git a/src/input_cp2k_mixed.F b/src/input_cp2k_mixed.F
index 9e0e3ec694..537e823ac4 100644
--- a/src/input_cp2k_mixed.F
+++ b/src/input_cp2k_mixed.F
@@ -48,13 +48,10 @@ MODULE input_cp2k_mixed
! *****************************************************************************
!> \brief Create the input section for MIXED.
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fschiff
! *****************************************************************************
- SUBROUTINE create_mix_section(section,error)
+ SUBROUTINE create_mix_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mix_section', &
routineP = moduleN//':'//routineN
@@ -66,12 +63,11 @@ SUBROUTINE create_mix_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="MIXED",&
description="This section contains all information to run with a hamiltonian "//&
"defined by a mixing of force_evals",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="MIXING_TYPE",&
@@ -90,132 +86,123 @@ SUBROUTINE create_mix_section(section,error)
"Use the difference between the energy of the force envs as a"//&
" restraint on the first (support only 2 force_evals)",&
"Defines a user-driven generica coupling (support for an unlimited number of force_eval)"),&
- enum_i_vals=(/mix_linear_combination,mix_minimum,mix_coupled,mix_restrained,mix_generic/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/mix_linear_combination,mix_minimum,mix_coupled,mix_restrained,mix_generic/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GROUP_PARTITION",&
description="gives the exact number of processors for each group."//&
" If not specified processors allocated will be equally distributed for"//&
" the specified subforce_eval, trying to build a number of groups equal to the"//&
" number of subforce_eval specified.",&
- usage="group_partition 2 2 4 2 4 ", type_of_var=integer_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="group_partition 2 2 4 2 4 ", type_of_var=integer_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGROUPS",variants=(/"NGROUP"/),&
description="Gives the wanted number of groups. If not specified the number"//&
" of groups is set to the number of subforce_eval defined.",&
- usage="ngroups 4", type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ngroups 4", type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Double force_eval
CALL section_create(subsection,name="LINEAR",&
description="Linear combination between two force_eval: F= lambda F1 + (1-lambda) F2",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="LAMBDA",&
description="Specify the mixing parameter lambda in the formula.",&
- usage="lambda ", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="lambda ", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="COUPLING",&
description="Coupling between two force_eval: E=(E1+E2 - sqrt((E1-E2)**2+4*H12**2))/2",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="COUPLING_PARAMETER",&
description="Coupling parameter H12 used in the coupling",&
- usage="COUPLING_PARAMETER ", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="COUPLING_PARAMETER ", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="RESTRAINT",&
description="Restraint between two force_eval: E = E1 + k*(E1-E2-t)**2",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="RESTRAINT_TARGET",&
description="Target value of the restraint (t) ",&
- usage="RESTRAINT_TARGET ", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESTRAINT_TARGET ", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTRAINT_STRENGTH",&
description="Strength of the restraint (k) in "//&
"k*(E1-E2-t)**2" ,&
- usage="RESTRAINT_STRENGTH ", type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="RESTRAINT_STRENGTH ", type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! Multiple force_eval
CALL section_create(subsection,name="GENERIC",&
description="User driven coupling between two or more force_eval.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="MIXING_FUNCTION",&
description="Specifies the mixing functional form in mathematical notation.",&
usage="MIXING_FUNCTION (E1+E2-LOG(E1/E2))", type_of_var=lchar_t,&
- n_var=1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VARIABLES",&
description="Defines the variables of the functional form. To allow an efficient"//&
" mapping the order of the energy variables will be considered identical to the"//&
" order of the force_eval in the force_eval_order list.",&
usage="VARIABLES x", type_of_var=char_t,&
- n_var=-1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNITS",&
description="Optionally, allows to define valid CP2K unit strings for each parameter value. "//&
"It is assumed that the corresponding parameter value is specified in this unit.",&
usage="UNITS angstrom eV*angstrom^-1 angstrom^1 K", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DX",&
description="Parameter used for computing the derivative with the Ridders' method.",&
- usage="DX ", default_r_val=0.1_dp, unit_str="bohr", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DX ", default_r_val=0.1_dp, unit_str="bohr")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ERROR_LIMIT",&
description="Checks that the error in computing the derivative is not larger than "//&
"the value set; in case error is larger a warning message is printed.",&
- usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="ERROR_LIMIT ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! Mapping of atoms
NULLIFY(sub2section, sub3section)
@@ -224,110 +211,98 @@ SUBROUTINE create_mix_section(section,error)
" The default is to have a mapping 1-1 between atom index (i.e. all force_eval share the same"//&
" geometrical structure). The mapping is based on defining fragments and the mapping the "//&
" fragments between the several force_eval and the mixed force_eval",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
! Mixed force_eval
CALL section_create(sub2section,name="FORCE_EVAL_MIXED",&
description="Defines the fragments for the mixed force_eval (reference)",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL section_create(sub3section,name="FRAGMENT",&
description="Fragment definition",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Defines the index of the fragment defined",&
- usage="", type_of_var=integer_t, n_var=1, error=error)
- CALL section_add_keyword(sub3section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="", type_of_var=integer_t, n_var=1)
+ CALL section_add_keyword(sub3section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Starting and ending atomic index defining one fragment must be provided",&
- usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2, repeats=.TRUE.,&
- error=error)
- CALL section_add_keyword(sub3section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2, repeats=.TRUE.)
+ CALL section_add_keyword(sub3section,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(sub2section,sub3section,error=error)
- CALL section_release(sub3section,error=error)
- CALL section_add_subsection(subsection,sub2section,error=error)
- CALL section_release(sub2section,error=error)
+ CALL section_add_subsection(sub2section,sub3section)
+ CALL section_release(sub3section)
+ CALL section_add_subsection(subsection,sub2section)
+ CALL section_release(sub2section)
! All other force_eval
CALL section_create(sub2section,name="FORCE_EVAL",&
description="Defines the fragments and the mapping for each force_eval (an integer index (ID) "//&
"needs to be provided as parameter)",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="DEFINE_FRAGMENTS",&
description="Specify the fragments definition of the force_eval through the fragments of the"//&
" force_eval_mixed. This avoids the pedantic definition of the fragments for the force_eval,"//&
" assuming the order of the fragments for the specified force_eval is the same as the sequence "//&
" of integers provided. Easier to USE should be preferred to the specification of the single fragments.",&
- usage="DEFINE_FRAGMENTS .. ", type_of_var=integer_t, n_var=-1,&
- error=error)
- CALL section_add_keyword(sub2section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DEFINE_FRAGMENTS .. ", type_of_var=integer_t, n_var=-1)
+ CALL section_add_keyword(sub2section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Defines the index of the force_eval for which fragments and mappings are provided",&
- usage="", type_of_var=integer_t, n_var=1, error=error)
- CALL section_add_keyword(sub2section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="", type_of_var=integer_t, n_var=1)
+ CALL section_add_keyword(sub2section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(sub3section,name="FRAGMENT",&
description="Fragment definition",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Defines the index of the fragment defined",&
- usage="", type_of_var=integer_t, n_var=1, error=error)
- CALL section_add_keyword(sub3section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="", type_of_var=integer_t, n_var=1)
+ CALL section_add_keyword(sub3section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Starting and ending atomic index defining one fragment must be provided",&
- usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2, repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub3section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2, repeats=.FALSE.)
+ CALL section_add_keyword(sub3section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAP",&
description="Provides the index of the fragment of the MIXED force_eval mapped on the"//&
" locally defined fragment.",&
- usage="MAP ", type_of_var=integer_t, n_var=1, repeats=.FALSE.,&
- error=error)
- CALL section_add_keyword(sub3section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
-
- CALL section_add_subsection(sub2section,sub3section,error=error)
- CALL section_release(sub3section,error=error)
- CALL section_add_subsection(subsection,sub2section,error=error)
- CALL section_release(sub2section,error=error)
-
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
-
- CALL create_print_mix_section(subsection, error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="MAP ", type_of_var=integer_t, n_var=1, repeats=.FALSE.)
+ CALL section_add_keyword(sub3section,keyword)
+ CALL keyword_release(keyword)
+
+ CALL section_add_subsection(sub2section,sub3section)
+ CALL section_release(sub3section)
+ CALL section_add_subsection(subsection,sub2section)
+ CALL section_release(sub2section)
+
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
+
+ CALL create_print_mix_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_mix_section
! *****************************************************************************
!> \brief Create the print section for mixed
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_print_mix_section(section,error)
+ SUBROUTINE create_print_mix_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_mix_section', &
routineP = moduleN//':'//routineN
@@ -336,29 +311,26 @@ SUBROUTINE create_print_mix_section(section,error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options in MIXED env.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of information during the evaluation of "//&
"the mixed environment. ",&
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DIPOLE",&
description="Controls the printing of dipole information. "//&
"Requires the DIPOLE calculation be active for all subforce_eval.", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_mix_section
END MODULE input_cp2k_mixed
diff --git a/src/input_cp2k_mm.F b/src/input_cp2k_mm.F
index 481978c29e..d340c5adb0 100644
--- a/src/input_cp2k_mm.F
+++ b/src/input_cp2k_mm.F
@@ -65,13 +65,10 @@ MODULE input_cp2k_mm
! *****************************************************************************
!> \brief Create the input section for FIST.. Come on.. Let's get woohooo
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_mm_section(section,error)
+ SUBROUTINE create_mm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mm_section', &
routineP = moduleN//':'//routineN
@@ -81,29 +78,28 @@ SUBROUTINE create_mm_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="mm",&
description="This section contains all information to run a MM calculation.",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_forcefield_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_forcefield_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_neighbor_lists_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_neighbor_lists_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_poisson_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_poisson_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_print_mm_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_mm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_mm_section
@@ -111,13 +107,10 @@ END SUBROUTINE create_mm_section
! *****************************************************************************
!> \brief Create the print mm section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_print_mm_section(section,error)
+ SUBROUTINE create_print_mm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_mm_section', &
routineP = moduleN//':'//routineN
@@ -127,96 +120,88 @@ SUBROUTINE create_print_mm_section(section,error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options in MM code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key, keyword)
CALL cp_print_key_section_create(print_key,"DERIVATIVES",&
description="Controls the printing of derivatives.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"EWALD_INFO",&
description="Controls the printing of Ewald energy components during the "//&
"evaluation of the electrostatics.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_dipoles_section(print_key,"DIPOLE",medium_print_level,error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL create_dipoles_section(print_key,"DIPOLE",medium_print_level)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"NEIGHBOR_LISTS",&
description="Activates the printing of the neighbor lists.", &
- print_level=high_print_level,filename="",unit_str="angstrom",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="",unit_str="angstrom")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ITER_INFO",&
description="Activates the printing of iteration info during the self-consistent "//&
"calculation of a polarizable forcefield.", &
- print_level=medium_print_level,filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SUBCELL",&
description="Activates the printing of the subcells used for the"//&
"generation of neighbor lists.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_BANNER",&
description="Controls the printing of the banner of the MM program",&
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of information regarding the run.",&
- print_level=low_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "FF_PARAMETER_FILE", description=&
"Controls the printing of Force Field parameter file", &
- print_level=debug_print_level+1,filename="",common_iter_levels=2,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level+1,filename="",common_iter_levels=2)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "FF_INFO", description=&
"Controls the printing of information in the forcefield settings", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword,"spline_info",&
description="if the printkey is active prints information regarding the splines"//&
" used in the nonbonded interactions",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"spline_data",&
description="if the printkey is active prints on separated files the splined function"//&
" together with the reference one. Useful to check the spline behavior.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_mm_section
@@ -224,13 +209,10 @@ END SUBROUTINE create_print_mm_section
!> \brief Create the forcefield section. This section is useful to set up the
!> proper force_field for FIST calculations
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_forcefield_section(section,error)
+ SUBROUTINE create_forcefield_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_forcefield_section', &
routineP = moduleN//':'//routineN
@@ -241,12 +223,11 @@ SUBROUTINE create_forcefield_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="FORCEFIELD",&
description="Section specifying information regarding how to set up properly"// &
" a force_field for the classical calculations.",&
- n_keywords=2, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=2, repeats=.FALSE.)
NULLIFY(subsection,keyword)
@@ -264,27 +245,27 @@ SUBROUTINE create_forcefield_section(section,error)
do_ff_g87,&
do_ff_g96,&
do_ff_amber/),&
- default_i_val=do_ff_undef, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_undef)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARM_FILE_NAME",&
description="Specifies the filename that contains the parameters of the FF.",&
- usage="PARM_FILE_NAME {FILENAME}",type_of_var=lchar_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PARM_FILE_NAME {FILENAME}",type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VDW_SCALE14",&
description="Scaling factor for the VDW 1-4 ",&
- usage="VDW_SCALE14 1.0", default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="VDW_SCALE14 1.0", default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EI_SCALE14",&
description="Scaling factor for the electrostatics 1-4 ",&
- usage="EI_SCALE14 1.0", default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EI_SCALE14 1.0", default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHIFT_CUTOFF",&
description="Add a constant energy shift to the real-space "//&
@@ -292,9 +273,9 @@ SUBROUTINE create_forcefield_section(section,error)
"electrostatic) such that the energy at the cutoff radius is "//&
"zero. This makes the non-bonding interactions continuous at "//&
"the cutoff.",&
- usage="SHIFT_CUTOFF ", default_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SHIFT_CUTOFF ", default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_NONBONDED",&
description="Controls the computation of all the real-space "//&
@@ -303,90 +284,87 @@ SUBROUTINE create_forcefield_section(section,error)
"or scaled 1-2, 1-3 and 1-4 interactions. When set "//&
"to F, the neighborlists are not created and all "//&
"interactions that depend on them are not computed.",&
- usage="DO_NONBONDED T",default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DO_NONBONDED T",default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="IGNORE_MISSING_CRITICAL_PARAMS",&
description="Do not abort when critical force-field parameters "//&
"are missing. CP2K will run as if the terms containing the "//&
"missing parameters are zero.",&
usage="IGNORE_MISSING_BOND_PARAMS T",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MULTIPLE_POTENTIAL",&
description="Enables the possibility to define NONBONDED and NONBONDED14 as a"//&
" sum of different kinds of potential. Useful for piecewise defined potentials.",&
- usage="MULTIPLE_POTENTIAL T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MULTIPLE_POTENTIAL T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!Universal scattering potential at very short distances
CALL keyword_create(keyword, name="ZBL_SCATTERING",&
description="A short range repulsive potential is added, to simulate "//&
"collisions and scattering.",&
- usage="ZBL_SCATTERING T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ZBL_SCATTERING T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
! subsections
!
- CALL create_SPLINE_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_SPLINE_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_NONBONDED_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_NONBONDED_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_NONBONDED14_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_NONBONDED14_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_CHARGE_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_CHARGE_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_CHARGES_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_CHARGES_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_SHELL_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_SHELL_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_BOND_section(subsection, "BOND", error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_BOND_section(subsection, "BOND")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_BEND_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_BEND_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_TORSION_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_TORSION_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_IMPROPER_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_IMPROPER_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_OPBEND_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_OPBEND_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_DIPOLE_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_DIPOLE_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_QUADRUPOLE_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_QUADRUPOLE_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_forcefield_section
@@ -394,13 +372,10 @@ END SUBROUTINE create_forcefield_section
! *****************************************************************************
!> \brief This section specifies the parameters for the splines
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_SPLINE_section(section,error)
+ SUBROUTINE create_SPLINE_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_SPLINE_section', &
routineP = moduleN//':'//routineN
@@ -410,12 +385,11 @@ SUBROUTINE create_SPLINE_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SPLINE",&
description="specifies parameters to set up the splines used in the"//&
" nonboned interactions (both pair body potential and many body potential)",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -423,71 +397,66 @@ SUBROUTINE create_SPLINE_section(section,error)
description="Specify the minimum value of the distance interval "//&
" that brackets the value of emax_spline.",&
usage="R0_NB ",default_r_val=cp_unit_to_cp2k(value=0.9_dp,&
- unit_str="bohr",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="bohr"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT_NB",&
description="Cutoff radius for nonbonded interactions. This value overrides "//&
" the value specified in the potential definition and is global for all potentials.",&
usage="RCUT_NB {real}", default_r_val=cp_unit_to_cp2k(value=-1.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EMAX_SPLINE",&
description="Specify the maximum value of the potential up to which"//&
" splines will be constructed",&
usage="EMAX_SPLINE ",&
- default_r_val=0.5_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.5_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EMAX_ACCURACY",&
description="Specify the maximum value of energy used to check the accuracy"//&
" requested through EPS_SPLINE. Energy values larger than EMAX_ACCURACY"//&
" generally do not satisfy the requested accuracy",&
- usage="EMAX_ACCURACY ", default_r_val=0.02_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EMAX_ACCURACY ", default_r_val=0.02_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SPLINE",&
description="Specify the threshold for the choice of the number of"//&
" points used in the splines (comparing the splined value with the "//&
" analytically evaluated one)",&
- usage="EPS_SPLINE ", default_r_val=1.0E-7_dp,unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SPLINE ", default_r_val=1.0E-7_dp,unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NPOINTS",&
description="Override the default search for an accurate spline by specifying a fixed number of spline points.",&
- usage="NPOINTS 1024", default_i_val=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NPOINTS 1024", default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNIQUE_SPLINE",&
description="For few potentials (Lennard-Jones) one global optimal spline is generated instead"//&
" of different optimal splines for each kind of potential",&
- usage="UNIQUE_SPLINE ",lone_keyword_l_val=.TRUE., default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="UNIQUE_SPLINE ",lone_keyword_l_val=.TRUE., default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_SPLINE_section
! *****************************************************************************
!> \brief This section specifies the torsion of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_TORSION_section(section,error)
+ SUBROUTINE create_TORSION_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_TORSION_section', &
routineP = moduleN//':'//routineN
@@ -497,19 +466,18 @@ SUBROUTINE create_TORSION_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="TORSION",&
description="Specifies the torsion potential of the MM system.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kinds involved in the tors.",&
usage="ATOMS {KIND1} {KIND2} {KIND3} {KIND4}", type_of_var=char_t,&
- n_var=4, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="KIND",&
description="Define the kind of torsion potential",&
@@ -523,43 +491,40 @@ SUBROUTINE create_TORSION_section(section,error)
do_ff_g87,&
do_ff_g96,&
do_ff_amber/),&
- default_i_val=do_ff_charmm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_charmm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Defines the force constant of the potential",&
usage="K {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PHI0",&
description="Defines the phase of the potential.",&
usage="PHI0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="rad", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="rad")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="M",&
description="Defines the multiplicity of the potential.",&
usage="M {integer}", type_of_var=integer_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_TORSION_section
! *****************************************************************************
!> \brief This section specifies the improper torsion of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author louis vanduyfhuys
! *****************************************************************************
- SUBROUTINE create_IMPROPER_section(section,error)
+ SUBROUTINE create_IMPROPER_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_IMPROPER_section', &
routineP = moduleN//':'//routineN
@@ -569,19 +534,18 @@ SUBROUTINE create_IMPROPER_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="IMPROPER",&
description="Specifies the improper torsion potential of the MM system.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kinds involved in the improper tors.",&
usage="ATOMS {KIND1} {KIND2} {KIND3} {KIND4}", type_of_var=char_t,&
- n_var=4, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="KIND",&
description="Define the kind of improper torsion potential",&
@@ -595,36 +559,33 @@ SUBROUTINE create_IMPROPER_section(section,error)
do_ff_g87,&
do_ff_g96,&
do_ff_harmonic/),&
- default_i_val=do_ff_charmm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_charmm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Defines the force constant of the potential",&
usage="K {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*rad^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*rad^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PHI0",&
description="Defines the phase of the potential.",&
usage="PHI0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="rad", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="rad")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_IMPROPER_section
! *****************************************************************************
!> \brief This section specifies the out of plane bend of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author louis vanduyfhuys
! *****************************************************************************
- SUBROUTINE create_OPBEND_section(section,error)
+ SUBROUTINE create_OPBEND_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_OPBEND_section', &
routineP = moduleN//':'//routineN
@@ -634,21 +595,20 @@ SUBROUTINE create_OPBEND_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="OPBEND",&
description="Specifies the out of plane bend potential of the MM system."//&
"(Only defined for atom quadruples which are also defined as an improper"//&
" pattern in the topology.)",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kinds involved in the opbend.",&
usage="ATOMS {KIND1} {KIND2} {KIND3} {KIND4}", type_of_var=char_t,&
- n_var=4, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=4)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="KIND",&
description="Define the kind of out of plane bend potential",&
@@ -662,36 +622,33 @@ SUBROUTINE create_OPBEND_section(section,error)
do_ff_mm2,&
do_ff_mm3,&
do_ff_mm4/),&
- default_i_val=do_ff_harmonic, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_harmonic)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Defines the force constant of the potential",&
usage="K {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*rad^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*rad^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PHI0",&
description="Defines the phase of the potential.",&
usage="PHI0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="rad", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="rad")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_OPBEND_section
! *****************************************************************************
!> \brief This section specifies the bend of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_BEND_section(section,error)
+ SUBROUTINE create_BEND_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_BEND_section', &
routineP = moduleN//':'//routineN
@@ -702,20 +659,19 @@ SUBROUTINE create_BEND_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BEND",&
description="Specifies the bend potential of the MM system.",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword,subsection)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kinds involved in the bend.",&
usage="ATOMS {KIND1} {KIND2} {KIND3}", type_of_var=char_t,&
- n_var=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="KIND",&
description="Define the kind of bend potential",&
@@ -740,66 +696,66 @@ SUBROUTINE create_BEND_section(section,error)
do_ff_cubic,&
do_ff_mixed_bend_stretch,&
do_ff_mm3/),&
- default_i_val=do_ff_charmm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_charmm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Defines the force constant of the potential",&
usage="K {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*rad^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*rad^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CB",&
description="Defines the the cubic force constant of the bend",&
usage="CB {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="rad^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="rad^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R012",&
description="Mixed bend stretch parameter",&
usage="R012 {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="bohr",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R032",&
description="Mixed bend stretch parameter",&
usage="R032 {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="bohr",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KBS12",&
description="Mixed bend stretch parameter",&
usage="KBS12 {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="hartree*bohr^-1*rad^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*bohr^-1*rad^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KBS32",&
description="Mixed bend stretch parameter",&
usage="KBS32 {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="hartree*bohr^-1*rad^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*bohr^-1*rad^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KSS",&
description="Mixed bend stretch parameter",&
usage="KSS {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="hartree*bohr^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*bohr^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="THETA0",&
description="Defines the equilibrium angle.",&
usage="THETA0 {real}", type_of_var=real_t,&
- n_var=1, unit_str='rad',error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str='rad')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Create the Urey-Bradley section
- CALL create_BOND_section(subsection,"UB",error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_BOND_section(subsection,"UB")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_BEND_section
@@ -808,14 +764,11 @@ END SUBROUTINE create_BEND_section
!> \brief This section specifies the bond of the MM atoms
!> \param section the section to create
!> \param label ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_BOND_section(section,label,error)
+ SUBROUTINE create_BOND_section(section,label)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: label
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_BOND_section', &
routineP = moduleN//':'//routineN
@@ -826,7 +779,7 @@ SUBROUTINE create_BOND_section(section,label,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword)
IF (TRIM(label)=="UB") THEN
@@ -834,22 +787,20 @@ SUBROUTINE create_BOND_section(section,label,error)
CALL section_create(section,name=TRIM(label),&
description="Specifies the Urey-Bradley potential between the external atoms"//&
" defining the angle",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
ELSE
tag = " Bond "
CALL section_create(section,name=TRIM(label),&
description="Specifies the bond potential",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kinds involved in the bond.",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END IF
CALL keyword_create(keyword=keyword, name="KIND",&
@@ -875,45 +826,42 @@ SUBROUTINE create_BOND_section(section,label,error)
do_ff_morse, &
do_ff_cubic, &
do_ff_fues/),&
- default_i_val=do_ff_charmm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ff_charmm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Defines the force constant of the potential. "//&
"For MORSE potentials 2 numbers are expected. "//&
"For QUARTIC potentials 3 numbers are expected.",&
usage="K {real}", type_of_var=real_t,&
- n_var=-1, unit_str="internal_cp2k",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CS",&
description="Defines the cubic stretch term.",&
usage="CS {real}", default_r_val=0.0_dp , type_of_var=real_t,&
- n_var=1, unit_str="bohr^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="bohr^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R0",&
description="Defines the equilibrium distance.",&
usage="R0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="bohr", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="bohr")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_BOND_section
! *****************************************************************************
!> \brief This section specifies the charge of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_charges_section(section,error)
+ SUBROUTINE create_charges_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_charges_section', &
routineP = moduleN//':'//routineN
@@ -923,33 +871,29 @@ SUBROUTINE create_charges_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="charges",&
description="Allow to specify an array of classical charges, thus avoiding the"//&
" packing and permitting the usage of different charges for same atomic types.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Value of the charge for the individual atom. Order MUST reflect"//&
" the one specified for the geometry.", repeats=.TRUE., usage="{Real}", &
- type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_charges_section
! *****************************************************************************
!> \brief This section specifies the charge of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_charge_section(section,error)
+ SUBROUTINE create_charge_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_charge_section', &
routineP = moduleN//':'//routineN
@@ -959,40 +903,36 @@ SUBROUTINE create_charge_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="charge",&
description="This section specifies the charge of the MM atoms",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOM",&
description="Defines the atomic kind of the charge.",&
usage="ATOM {KIND1}", type_of_var=char_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE",&
description="Defines the charge of the MM atom in electron charge unit.",&
usage="CHARGE {real}", type_of_var=real_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_charge_section
! *****************************************************************************
!> \brief This section specifies the isotropic polarizability of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Marcel Baer
! *****************************************************************************
- SUBROUTINE create_quadrupole_section(section,error)
+ SUBROUTINE create_quadrupole_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_quadrupole_section', &
routineP = moduleN//':'//routineN
@@ -1002,41 +942,37 @@ SUBROUTINE create_quadrupole_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="QUADRUPOLE",&
description="This section specifies that we will perform an SCF quadrupole calculation of the MM atoms. "//&
"Needs KEYWORD POL_SCF in POISSON secton",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOM",&
description="Defines the atomic kind of the SCF quadrupole.",&
usage="ATOM {KIND1}", type_of_var=char_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CPOL",&
description="Defines the isotropic polarizability of the MM atom.",&
usage="CPOL {real}", type_of_var=real_t,&
- n_var=1, unit_str='internal_cp2k', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str='internal_cp2k')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_quadrupole_section
! *****************************************************************************
!> \brief This section specifies the isotropic polarizability of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Marcel Baer
! *****************************************************************************
- SUBROUTINE create_dipole_section(section,error)
+ SUBROUTINE create_dipole_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dipole_section', &
routineP = moduleN//':'//routineN
@@ -1047,44 +983,40 @@ SUBROUTINE create_dipole_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DIPOLE",&
description="This section specifies that we will perform an SCF dipole calculation of the MM atoms. "//&
"Needs KEYWORD POL_SCF in POISSON secton",&
- n_keywords=1, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.TRUE.)
NULLIFY(subsection,keyword)
CALL keyword_create(keyword, name="ATOM",&
description="Defines the atomic kind of the SCF dipole.",&
usage="ATOM {KIND1}", type_of_var=char_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APOL",&
description="Defines the isotropic polarizability of the MM atom.",&
usage="APOL {real}", type_of_var=real_t,&
- n_var=1, unit_str='angstrom^3', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str='angstrom^3')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_DAMPING_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_DAMPING_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_dipole_section
! *****************************************************************************
!> \brief This section specifies the idamping parameters for polarizable atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Rodolphe Vuilleumier
! *****************************************************************************
- SUBROUTINE create_damping_section(section,error)
+ SUBROUTINE create_damping_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_damping_section', &
routineP = moduleN//':'//routineN
@@ -1094,62 +1026,58 @@ SUBROUTINE create_damping_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DAMPING",&
description="This section specifies optional electric field damping for the polarizable atoms. ",&
- n_keywords=4, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=4, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOM",&
description="Defines the atomic kind for this damping function.",&
usage="ATOM {KIND1}", type_of_var=char_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE",&
description="Defines the damping type.",&
usage="TYPE {string}", type_of_var=char_t,&
- n_var=1, default_c_val="TANG-TOENNIES", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_c_val="TANG-TOENNIES")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORDER",&
description="Defines the order for this damping.",&
usage="ORDER {integer}", type_of_var=integer_t,&
- n_var=1, default_i_val=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BIJ",&
description="Defines the BIJ parameter for this damping.",&
usage="BIJ {real}", type_of_var=real_t,&
- n_var=1, unit_str='angstrom^-1', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str='angstrom^-1')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CIJ",&
description="Defines the CIJ parameter for this damping.",&
usage="CIJ {real}", type_of_var=real_t,&
- n_var=1, unit_str='', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str='')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_damping_section
! *****************************************************************************
!> \brief This section specifies the charge of the MM atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_shell_section(section,error)
+ SUBROUTINE create_shell_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_shell_section', &
routineP = moduleN//':'//routineN
@@ -1159,44 +1087,43 @@ SUBROUTINE create_shell_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section, name="SHELL",&
description="This section specifies the parameters for shell-model potentials",&
n_keywords=6, n_subsections=0, repeats=.TRUE., &
- citations=(/Dick1958,Mitchell1993,Devynck2012/),&
- error=error)
+ citations=(/Dick1958,Mitchell1993,Devynck2012/))
NULLIFY(keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="The kind for which the shell potential parameters are given ",&
- usage="H", default_c_val="DEFAULT", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="H", default_c_val="DEFAULT")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORE_CHARGE",&
variants=(/"CORE"/),&
description="Partial charge assigned to the core (electron charge units)",&
usage="CORE_CHARGE {real}",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHELL_CHARGE",&
variants=(/"SHELL"/),&
description="Partial charge assigned to the shell (electron charge units)",&
usage="SHELL_CHARGE {real}",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MASS_FRACTION",&
variants=(/"MASS"/),&
description="Fraction of the mass of the atom to be assigned to the shell",&
usage="MASS_FRACTION {real}",&
- default_r_val=0.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K2_SPRING",&
variants=s2a("K2","SPRING"),&
@@ -1205,10 +1132,9 @@ SUBROUTINE create_shell_section(section,error)
repeats=.FALSE.,&
usage="K2_SPRING {real}",&
default_r_val=-1.0_dp,&
- unit_str="hartree*bohr^-2",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="hartree*bohr^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K4_SPRING",&
variants=s2a("K4"),&
@@ -1218,19 +1144,18 @@ SUBROUTINE create_shell_section(section,error)
repeats=.FALSE.,&
usage="K4_SPRING {real}",&
default_r_val=0.0_dp,&
- unit_str="hartree*bohr^-4",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="hartree*bohr^-4")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_DISTANCE",&
description="Assign a maximum elongation of the spring, "//&
"if negative no limit is imposed",&
usage="MAX_DISTANCE 0.0",&
default_r_val=-1.0_dp,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHELL_CUTOFF",&
description="Define a screening function to exclude some neighbors "//&
@@ -1238,9 +1163,9 @@ SUBROUTINE create_shell_section(section,error)
"if negative no screening is operated",&
usage="SHELL_CUTOFF -1.0",&
default_r_val=-1.0_dp,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_shell_section
@@ -1249,13 +1174,10 @@ END SUBROUTINE create_shell_section
!> \brief This section specifies the input parameters for 1-4 NON-BONDED
!> Interactions
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_NONBONDED14_section(section,error)
+ SUBROUTINE create_NONBONDED14_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_NONBONDED14_section', &
routineP = moduleN//':'//routineN
@@ -1265,28 +1187,27 @@ SUBROUTINE create_NONBONDED14_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="nonbonded14",&
description="This section specifies the input parameters for 1-4 NON-BONDED interactions.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_LJ_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_LJ_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Williams_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Williams_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Goodwin_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Goodwin_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_GENPOT_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_GENPOT_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_NONBONDED14_section
@@ -1295,13 +1216,10 @@ END SUBROUTINE create_NONBONDED14_section
!> \brief This section specifies the input parameters for 1-4 NON-BONDED
!> Interactions
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_NONBONDED_section(section,error)
+ SUBROUTINE create_NONBONDED_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_NONBONDED_section', &
routineP = moduleN//':'//routineN
@@ -1311,64 +1229,63 @@ SUBROUTINE create_NONBONDED_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="nonbonded",&
description="This section specifies the input parameters for NON-BONDED interactions.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_LJ_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_LJ_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Williams_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Williams_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_EAM_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_EAM_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_QUIP_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_QUIP_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Goodwin_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Goodwin_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_IPBV_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_IPBV_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_BMHFT_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_BMHFT_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_BMHFTD_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_BMHFTD_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Buck4r_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Buck4r_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Buckmorse_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Buckmorse_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_GENPOT_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_GENPOT_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Tersoff_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Tersoff_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Siepmann_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Siepmann_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_NONBONDED_section
@@ -1377,13 +1294,10 @@ END SUBROUTINE create_NONBONDED_section
!> \brief This section specifies the input parameters for generation of
!> neighbor lists
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo [07.2007] - Zurich University
! *****************************************************************************
- SUBROUTINE create_neighbor_lists_section(section,error)
+ SUBROUTINE create_neighbor_lists_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_neighbor_lists_section', &
@@ -1395,28 +1309,26 @@ SUBROUTINE create_neighbor_lists_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="neighbor_lists",&
description="This section specifies the input parameters for the construction of"//&
" neighbor lists.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="VERLET_SKIN",&
description="Defines the Verlet Skin for the generation of the neighbor lists",&
usage="VERLET_SKIN {real}", default_r_val=cp_unit_to_cp2k(value=1.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="neighbor_lists_from_scratch",&
description="This keyword enables the building of the neighbouring list from scratch.",&
usage="neighbor_lists_from_scratch logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GEO_CHECK",&
description="This keyword enables the check that two atoms are never below the minimum"//&
@@ -1424,9 +1336,9 @@ SUBROUTINE create_neighbor_lists_section(section,error)
" Disabling this keyword avoids CP2K to abort in case two atoms are below the minimum "//&
" value of the radius used to generate the splines.",&
usage="GEO_CHECK",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_neighbor_lists_section
@@ -1434,13 +1346,10 @@ END SUBROUTINE create_neighbor_lists_section
! *****************************************************************************
!> \brief This section specifies the input parameters for a generic potential form
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_GENPOT_section(section,error)
+ SUBROUTINE create_GENPOT_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_GENPOT_section', &
routineP = moduleN//':'//routineN
@@ -1450,7 +1359,7 @@ SUBROUTINE create_GENPOT_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="GENPOT",&
description="This section specifies the input parameters for a generic potential type."//&
"A functional form is specified. Mathematical Operators recognized are +, -, *, /, ** "//&
@@ -1458,89 +1367,84 @@ SUBROUTINE create_GENPOT_section(section,error)
"The function parser recognizes the (single argument) Fortran 90 intrinsic functions "//&
"abs, exp, log10, log, sqrt, sinh, cosh, tanh, sin, cos, tan, asin, acos, atan. "//&
"Parsing for INTRINSIC functions is CASE INsensitive.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the generic potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTION",&
description="Specifies the functional form in mathematical notation.",&
usage="FUNCTION a*EXP(-b*x^2)/x+D*log10(x)", type_of_var=lchar_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VARIABLES",&
description="Defines the variable of the functional form.",&
usage="VARIABLES x", type_of_var=char_t,&
- n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETERS",&
description="Defines the parameters of the functional form",&
usage="PARAMETERS a b D", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VALUES",&
description="Defines the values of parameter of the functional form",&
usage="VALUES ", type_of_var=real_t,&
- n_var=-1, repeats=.TRUE., unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE., unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="UNITS",&
description="Optionally, allows to define valid CP2K unit strings for each parameter value. "//&
"It is assumed that the corresponding parameter value is specified in this unit.",&
usage="UNITS angstrom eV*angstrom^-1 angstrom^1 K", type_of_var=char_t,&
- n_var=-1, repeats=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the generic potential",&
usage="RCUT {real}", default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_GENPOT_section
! *****************************************************************************
!> \brief This section specifies the input parameters for EAM potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_EAM_section(section,error)
+ SUBROUTINE create_EAM_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_EAM_section', &
routineP = moduleN//':'//routineN
@@ -1550,20 +1454,19 @@ SUBROUTINE create_EAM_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EAM",&
description="This section specifies the input parameters for EAM potential type.",&
- citations=(/Foiles1986/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/Foiles1986/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARM_FILE_NAME",&
variants=(/"PARMFILE"/),&
@@ -1577,22 +1480,19 @@ SUBROUTINE create_EAM_section(section,error)
"in order npoints lines for rho [au_c] and its derivative [au_c*angstrom^-1]; npoints lines for "//&
"PHI [ev] and its derivative [ev*angstrom^-1] and npoint lines for the embedded function [ev] "//&
"and its derivative [ev*au_c^-1].",&
- usage="PARM_FILE_NAME {FILENAME}",default_lc_val=" ",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PARM_FILE_NAME {FILENAME}",default_lc_val=" ")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_EAM_section
! *****************************************************************************
!> \brief This section specifies the input parameters for QUIP potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_QUIP_section(section,error)
+ SUBROUTINE create_QUIP_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_QUIP_section', &
routineP = moduleN//':'//routineN
@@ -1602,15 +1502,14 @@ SUBROUTINE create_QUIP_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="QUIP",&
description="This section specifies the input parameters for QUIP potential type. " //&
"Mainly intended for things like GAP corrections to DFT "//&
"to achieve correlated-wavefunction-like accuracy. " //&
"Requires linking with quip library from http://www.libatoms.org .",&
- citations=(/QUIP_ref/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/QUIP_ref/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -1620,31 +1519,31 @@ SUBROUTINE create_QUIP_section(section,error)
"has been mentioned at least once. Set IGNORE_MISSING_CRITICAL_PARAMS to T "//&
"in enclosing &FORCEFIELD section to avoid having to list every pair of elements separately.",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARM_FILE_NAME",&
variants=(/"PARMFILE"/),&
description="Specifies the filename that contains the QUIP potential.",&
- usage="PARM_FILE_NAME {FILENAME}",default_lc_val="quip_params.xml",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="PARM_FILE_NAME {FILENAME}",default_lc_val="quip_params.xml")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INIT_ARGS",&
description="Specifies the potential initialization arguments for the QUIP potential. "//&
"If blank (default) first potential defined in QUIP parameter file will be used.",&
usage="INIT_ARGS",default_c_vals=(/""/),&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CALC_ARGS",&
description="Specifies the potential calculation arguments for the QUIP potential.",&
usage="CALC_ARGS",default_c_vals=(/""/), &
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_QUIP_section
@@ -1652,13 +1551,10 @@ END SUBROUTINE create_QUIP_section
! *****************************************************************************
!> \brief This section specifies the input parameters for Lennard-Jones potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_LJ_section(section,error)
+ SUBROUTINE create_LJ_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_LJ_section', &
routineP = moduleN//':'//routineN
@@ -1668,71 +1564,66 @@ SUBROUTINE create_LJ_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="lennard-jones",&
description="This section specifies the input parameters for LENNARD-JONES potential type."//&
"Functional form: V(r) = 4.0 * EPSILON * [(SIGMA/r)^12-(SIGMA/r)^6].",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPSILON",&
description="Defines the EPSILON parameter of the LJ potential",&
usage="EPSILON {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIGMA",&
description="Defines the SIGMA parameter of the LJ potential",&
usage="SIGMA {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the LJ potential",&
usage="RCUT {real}", default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_LJ_section
! *****************************************************************************
!> \brief This section specifies the input parameters for Williams potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_Williams_section(section,error)
+ SUBROUTINE create_Williams_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Williams_section', &
routineP = moduleN//':'//routineN
@@ -1742,78 +1633,73 @@ SUBROUTINE create_Williams_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="williams",&
description="This section specifies the input parameters for WILLIAMS potential type."//&
"Functional form: V(r) = A*EXP(-B*r) - C / r^6 .",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A",&
description="Defines the A parameter of the Williams potential",&
usage="A {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of the Williams potential",&
usage="B {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Defines the C parameter of the Williams potential",&
usage="C {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e*angstrom^6",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e*angstrom^6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the Williams potential",&
usage="RCUT {real}",default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Williams_section
! *****************************************************************************
!> \brief This section specifies the input parameters for Goodwin potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_Goodwin_section(section,error)
+ SUBROUTINE create_Goodwin_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Goodwin_section', &
routineP = moduleN//':'//routineN
@@ -1823,91 +1709,86 @@ SUBROUTINE create_Goodwin_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="goodwin",&
description="This section specifies the input parameters for GOODWIN potential type."//&
"Functional form: V(r) = EXP(M*(-(r/DC)**MC+(D/DC)**MC))*VR0*(D/r)**M.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="VR0",&
description="Defines the VR0 parameter of the Goodwin potential",&
usage="VR0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D",&
description="Defines the D parameter of the Goodwin potential",&
usage="D {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DC",&
description="Defines the DC parameter of the Goodwin potential",&
usage="DC {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="M",&
description="Defines the M parameter of the Goodwin potential",&
usage="M {real}", type_of_var=integer_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MC",&
description="Defines the MC parameter of the Goodwin potential",&
usage="MC {real}", type_of_var=integer_t,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the Goodwin potential",&
usage="RCUT {real}",default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Goodwin_section
! *****************************************************************************
!> \brief This section specifies the input parameters for IPBV potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_ipbv_section(section,error)
+ SUBROUTINE create_ipbv_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ipbv_section', &
routineP = moduleN//':'//routineN
@@ -1917,57 +1798,52 @@ SUBROUTINE create_ipbv_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ipbv",&
description="This section specifies the input parameters for IPBV potential type."//&
"Functional form: Implicit table function.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the IPBV nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the IPBV potential",&
usage="RCUT {real}",default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ipbv_section
! *****************************************************************************
!> \brief This section specifies the input parameters for BMHFT potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_BMHFT_section(section,error)
+ SUBROUTINE create_BMHFT_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_BMHFT_section', &
routineP = moduleN//':'//routineN
@@ -1977,92 +1853,88 @@ SUBROUTINE create_BMHFT_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BMHFT",&
description="This section specifies the input parameters for BMHFT potential type."//&
"Functional form: V(r) = A * EXP(-B*r) - C/r^6 - D/r^8."//&
"Values available inside cp2k only for the Na/Cl pair.",&
- citations=(/Tosi1964a,Tosi1964b/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/Tosi1964a,Tosi1964b/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the BMHFT nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAP_ATOMS",&
description="Defines the kinds for which internally is defined the BMHFT nonbond potential"//&
" at the moment only Na and Cl.",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the BMHFT potential",&
usage="RCUT {real}", default_r_val=7.8_dp,&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A",&
description="Defines the A parameter of the Fumi-Tosi Potential",&
usage="A {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of the Fumi-Tosi Potential",&
usage="B {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Defines the C parameter of the Fumi-Tosi Potential",&
usage="C {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*angstrom^6",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*angstrom^6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D",&
description="Defines the D parameter of the Fumi-Tosi Potential",&
usage="D {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*angstrom^8",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*angstrom^8")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_BMHFT_section
! *****************************************************************************
!> \brief This section specifies the input parameters for BMHFTD potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Mathieu Salanne 05.2010
! *****************************************************************************
- SUBROUTINE create_BMHFTD_section(section,error)
+ SUBROUTINE create_BMHFTD_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_BMHFTD_section', &
routineP = moduleN//':'//routineN
@@ -2072,108 +1944,104 @@ SUBROUTINE create_BMHFTD_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BMHFTD",&
description="This section specifies the input parameters for BMHFTD potential type."//&
"Functional form: V(r) = A*exp(-B*r) - f_6*(r)C/r^6 - f_8(r)*D/r^8."//&
"where f_order(r)=1-exp(-BD * r) * \sum_{k=0}^order (BD * r)^k / k! ."//&
"(Tang-Toennies damping function)"//&
"No values available inside cp2k.",&
- citations=(/Tosi1964a,Tosi1964b/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/Tosi1964a,Tosi1964b/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the BMHFTD nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAP_ATOMS",&
description="Defines the kinds for which internally is defined the BMHFTD nonbond potential"//&
" at the moment no species included.",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the BMHFTD potential",&
usage="RCUT {real}", default_r_val=7.8_dp,&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A",&
description="Defines the A parameter of the dispersion-damped Fumi-Tosi Potential",&
usage="A {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of the dispersion-damped Fumi-Tosi Potential",&
usage="B {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Defines the C parameter of the dispersion-damped Fumi-Tosi Potential",&
usage="C {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*angstrom^6",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*angstrom^6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D",&
description="Defines the D parameter of the dispersion-damped Fumi-Tosi Potential",&
usage="D {real}", type_of_var=real_t,&
- n_var=1, unit_str="hartree*angstrom^8",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="hartree*angstrom^8")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BD",&
description="Defines the BD parameter of the dispersion-damped Fumi-Tosi Potential",&
usage="D {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ORDER",&
description="Defines the order for this damping.",&
usage="ORDER {integer}", type_of_var=integer_t,&
- n_var=1, default_i_val=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_BMHFTD_section
! *****************************************************************************
!> \brief This section specifies the input parameters for Buckingham 4 ranges potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MI
! *****************************************************************************
- SUBROUTINE create_Buck4r_section(section,error)
+ SUBROUTINE create_Buck4r_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Buck4r_section', &
routineP = moduleN//':'//routineN
@@ -2183,7 +2051,7 @@ SUBROUTINE create_Buck4r_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BUCK4RANGES",&
description="This section specifies the input parameters for the Buckingham 4-ranges"//&
" potential type."//&
@@ -2192,111 +2060,106 @@ SUBROUTINE create_Buck4r_section(section,error)
"V(r) = Sum_n POLY1(n)*rn for r1 ≤ r < r2"//&
"V(r) = Sum_n POLY2(n)*rn for r2 ≤ r < r3"//&
"V(r) = -C/r6 for r ≥ r3",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A",&
description="Defines the A parameter of the Buckingham potential",&
usage="A {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of the Buckingham potential",&
usage="B {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Defines the C parameter of the Buckingham potential",&
usage="C {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e*angstrom^6",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e*angstrom^6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R1",&
description="Defines the upper bound of the first range ",&
usage="R1 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R2",&
description="Defines the upper bound of the second range ",&
usage="R2 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R3",&
description="Defines the upper bound of the third range ",&
usage="R3 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="POLY1",&
description="Coefficients of the polynomial used in the second range"//&
"This keyword can be repeated several times.",&
usage="POLY1 C1 C2 C3 ..",&
- n_var=-1,unit_str="K_e",type_of_var=real_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,unit_str="K_e",type_of_var=real_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="POLY2",&
description="Coefficients of the polynomial used in the third range"//&
"This keyword can be repeated several times.",&
usage="POLY1 C1 C2 C3 ..",&
- n_var=-1,unit_str="K_e",type_of_var=real_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,unit_str="K_e",type_of_var=real_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the Buckingham potential",&
usage="RCUT {real}",default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Buck4r_section
! *****************************************************************************
!> \brief This section specifies the input parameters for Buckingham + Morse potential type
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MI
! *****************************************************************************
- SUBROUTINE create_Buckmorse_section(section,error)
+ SUBROUTINE create_Buckmorse_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Buckmorse_section', &
routineP = moduleN//':'//routineN
@@ -2306,108 +2169,106 @@ SUBROUTINE create_Buckmorse_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="BUCKMORSE",&
description="This section specifies the input parameters for"//&
" Buckingham plus Morse potential type "//&
" Functional Form: V(r) = F0*(B1+B2)*EXP([A1+A2-r]/[B1+B2])-C/r^6+D*{EXP[-2*beta*(r-R0)]-2*EXP[-beta*(r-R0)]}.",&
- citations=(/Yamada2000/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/Yamada2000/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="F0",&
description="Defines the f0 parameter of Buckingham+Morse potential",&
usage="F0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e*angstrom^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e*angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A1",&
description="Defines the A1 parameter of Buckingham+Morse potential",&
usage="A1 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A2",&
description="Defines the A2 parameter of Buckingham+Morse potential",&
usage="A2 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B1",&
description="Defines the B1 parameter of Buckingham+Morse potential",&
usage="B1 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B2",&
description="Defines the B2 parameter of Buckingham+Morse potential",&
usage="B2 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Defines the C parameter of Buckingham+Morse potential",&
usage="C {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e*angstrom^6",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e*angstrom^6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D",&
description="Defines the amplitude for the Morse part ",&
usage="D {real}", type_of_var=real_t,&
- n_var=1, unit_str="K_e",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="K_e")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R0",&
description="Defines the equilibrium distance for the Morse part ",&
usage="R0 {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Beta",&
description="Defines the width for the Morse part ",&
usage="Beta {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom^-1",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the Buckingham potential",&
usage="RCUT {real}",default_r_val=cp_unit_to_cp2k(value=10.0_dp,&
- unit_str="angstrom",&
- error=error),&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Defines the lower bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMIN {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Defines the upper bound of the potential. If not set the range is the"//&
" full range generate by the spline", usage="RMAX {real}", &
- type_of_var=real_t, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Buckmorse_section
@@ -2415,11 +2276,9 @@ END SUBROUTINE create_Buckmorse_section
!> \brief This section specifies the input parameters for Tersoff potential type
!> (Tersoff, J. PRB 39(8), 5566, 1989)
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_Tersoff_section(section,error)
+ SUBROUTINE create_Tersoff_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Tersoff_section', &
routineP = moduleN//':'//routineN
@@ -2429,138 +2288,130 @@ SUBROUTINE create_Tersoff_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="TERSOFF",&
description="This section specifies the input parameters for Tersoff potential type.",&
- citations=(/Tersoff1988/),n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ citations=(/Tersoff1988/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A",&
description="Defines the A parameter of Tersoff potential",&
usage="A {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=1.8308E3_dp,&
- unit_str="eV",&
- error=error),&
- n_var=1, unit_str="eV", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="eV"),&
+ n_var=1, unit_str="eV")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of Tersoff potential",&
usage="B {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=4.7118E2_dp,&
- unit_str="eV",&
- error=error),&
- n_var=1, unit_str="eV", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="eV"),&
+ n_var=1, unit_str="eV")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="lambda1",&
description="Defines the lambda1 parameter of Tersoff potential",&
usage="lambda1 {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=2.4799_dp,&
- unit_str="angstrom^-1",&
- error=error),&
- n_var=1, unit_str="angstrom^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom^-1"),&
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="lambda2",&
description="Defines the lambda2 parameter of Tersoff potential",&
usage="lambda2 {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=1.7322_dp,&
- unit_str="angstrom^-1",&
- error=error),&
- n_var=1, unit_str="angstrom^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom^-1"),&
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="alpha",&
description="Defines the alpha parameter of Tersoff potential",&
usage="alpha {real}", type_of_var=real_t,&
default_r_val=0.0_dp,&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="beta",&
description="Defines the beta parameter of Tersoff potential",&
usage="beta {real}", type_of_var=real_t,&
default_r_val=1.0999E-6_dp,&
- n_var=1, unit_str="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="n",&
description="Defines the n parameter of Tersoff potential",&
usage="n {real}", type_of_var=real_t,&
default_r_val=7.8734E-1_dp,&
- n_var=1, unit_str="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="c",&
description="Defines the c parameter of Tersoff potential",&
usage="c {real}", type_of_var=real_t,&
default_r_val=1.0039E5_dp,&
- n_var=1, unit_str="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="d",&
description="Defines the d parameter of Tersoff potential",&
usage="d {real}", type_of_var=real_t,&
default_r_val=1.6218E1_dp,&
- n_var=1, unit_str="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="h",&
description="Defines the h parameter of Tersoff potential",&
usage="h {real}", type_of_var=real_t,&
default_r_val=-5.9826E-1_dp,&
- n_var=1, unit_str="", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="lambda3",&
description="Defines the lambda3 parameter of Tersoff potential",&
usage="lambda3 {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=1.7322_dp,&
- unit_str="angstrom^-1",&
- error=error),&
- n_var=1, unit_str="angstrom^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom^-1"),&
+ n_var=1, unit_str="angstrom^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="bigR",&
description="Defines the bigR parameter of Tersoff potential",&
usage="bigR {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=2.85_dp,&
- unit_str="angstrom",&
- error=error),&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="bigD",&
description="Defines the D parameter of Tersoff potential",&
usage="bigD {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=0.15_dp,&
- unit_str="angstrom",&
- error=error),&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of the tersoff potential. "//&
@@ -2569,9 +2420,9 @@ SUBROUTINE create_Tersoff_section(section,error)
" in conjuction with other potentials (for the same atomic pair) in order to have"//&
" the same consistent definition of RCUT for all potentials.",&
usage="RCUT {real}", type_of_var=real_t,&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Tersoff_section
@@ -2580,11 +2431,9 @@ END SUBROUTINE create_Tersoff_section
!> potential type
!> (Siepmann and Sprik, J. Chem. Phys. 102(1) 511, 1995)
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_Siepmann_section(section,error)
+ SUBROUTINE create_Siepmann_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_Siepmann_section', &
routineP = moduleN//':'//routineN
@@ -2594,7 +2443,7 @@ SUBROUTINE create_Siepmann_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SIEPMANN",&
description="This section specifies the input parameters for the"//&
" Siepmann-Sprik potential type. Consists of 4 terms:"//&
@@ -2602,80 +2451,75 @@ SUBROUTINE create_Siepmann_section(section,error)
" have to be given via the GENPOT section. The terms T3+T4"//&
" are obtained from the SIEPMANN section. The Siepmann-Sprik"//&
" potential is designed for water-metal chemisorption.",&
- citations=(/Siepmann1995/),n_keywords=1, n_subsections=0, repeats=.TRUE.,&
- error=error)
+ citations=(/Siepmann1995/),n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Defines the atomic kind involved in the nonbond potential",&
usage="ATOMS {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Defines the B parameter of Siepmann potential",&
usage="B {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=0.6_dp,&
- unit_str="angstrom",&
- error=error),&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="D",&
description="Defines the D parameter of Siepmann potential",&
usage="D {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=3.688388_dp,&
- unit_str="internal_cp2k",&
- error=error),&
- n_var=1, unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="internal_cp2k"),&
+ n_var=1, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="E",&
description="Defines the E parameter of Siepmann potential",&
usage="E {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=9.069025_dp,&
- unit_str="internal_cp2k",&
- error=error),&
- n_var=1, unit_str="internal_cp2k", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="internal_cp2k"),&
+ n_var=1, unit_str="internal_cp2k")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="F",&
description="Defines the F parameter of Siepmann potential",&
usage="B {real}", type_of_var=real_t,&
- default_r_val=13.3_dp,n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=13.3_dp,n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="beta",&
description="Defines the beta parameter of Siepmann potential",&
usage="beta {real}", type_of_var=real_t,&
- default_r_val=10.0_dp, n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=10.0_dp, n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="RCUT",&
description="Defines the cutoff parameter of Siepmann potential",&
usage="RCUT {real}", type_of_var=real_t,&
default_r_val=cp_unit_to_cp2k(value=3.2_dp,&
- unit_str="angstrom",&
- error=error),&
- n_var=1, unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),&
+ n_var=1, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
!
CALL keyword_create(keyword, name="ALLOW_OH_FORMATION",&
description="If water is treated at the QM level, water molecules"//&
" can potentially dissociate. In that case, the T3"//&
" term (dipole term) is switched off.",&
usage="ALLOW_OH_FORMATION TRUE",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_Siepmann_section
@@ -2684,15 +2528,12 @@ END SUBROUTINE create_Siepmann_section
!> \param print_key ...
!> \param label ...
!> \param print_level ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_dipoles_section(print_key,label,print_level,error)
+ SUBROUTINE create_dipoles_section(print_key,label,print_level)
TYPE(section_type), POINTER :: print_key
CHARACTER(LEN=*), INTENT(IN) :: label
INTEGER, INTENT(IN) :: print_level
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dipoles_section', &
routineP = moduleN//':'//routineN
@@ -2701,12 +2542,12 @@ SUBROUTINE create_dipoles_section(print_key,label,print_level,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,failure)
CALL cp_print_key_section_create(print_key_section=print_key,name=TRIM(label),&
description="Section controlling the calculation of "//TRIM(label)//"."//&
" Note that the result in the periodic case might be defined modulo a certain period,"//&
" determined by the lattice vectors. During MD, this can lead to jumps.",&
- print_level=print_level,filename="__STD_OUT__",error=error)
+ print_level=print_level,filename="__STD_OUT__")
NULLIFY(keyword)
CALL keyword_create(keyword=keyword,&
@@ -2716,10 +2557,9 @@ SUBROUTINE create_dipoles_section(print_key,label,print_level,error)
usage="PERIODIC {logical}",&
repeats=.FALSE.,&
n_var=1,&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="REFERENCE",&
variants=s2a("REF"),&
@@ -2734,9 +2574,9 @@ SUBROUTINE create_dipoles_section(print_key,label,print_level,error)
use_mom_ref_coac,&
use_mom_ref_user,&
use_mom_ref_zero /),&
- default_i_val=use_mom_ref_zero, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=use_mom_ref_zero)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword, name="REFERENCE_POINT",&
variants=s2a("REF_POINT"),&
@@ -2745,10 +2585,9 @@ SUBROUTINE create_dipoles_section(print_key,label,print_level,error)
repeats=.FALSE.,&
n_var=3,default_r_vals=(/0._dp,0._dp,0._dp/),&
type_of_var=real_t, &
- unit_str='bohr',&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str='bohr')
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_dipoles_section
END MODULE input_cp2k_mm
diff --git a/src/input_cp2k_motion_print.F b/src/input_cp2k_motion_print.F
index c6ea9db084..8437f5da3e 100644
--- a/src/input_cp2k_motion_print.F
+++ b/src/input_cp2k_motion_print.F
@@ -45,13 +45,10 @@ MODULE input_cp2k_motion_print
! *****************************************************************************
!> \brief creates the motion%print section
!> \param section the section to be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_motion_print_section(section,error)
+ SUBROUTINE create_motion_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_motion_print_section', &
routineP = moduleN//':'//routineN
@@ -63,44 +60,43 @@ SUBROUTINE create_motion_print_section(section,error)
CALL section_create(section,name="print",&
description="Controls the printing properties during an MD run",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
CALL cp_print_key_section_create(print_key,"TRAJECTORY",&
description="Controls the output of the trajectory",&
print_level=low_print_level, common_iter_levels=1,&
- filename="",unit_str="angstrom",error=error)
+ filename="",unit_str="angstrom")
CALL add_format_keyword(keyword, print_key, pos=.TRUE.,&
- description="Specifies the format of the output file for the trajectory.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the trajectory.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SHELL_TRAJECTORY",&
description="Controls the output of the trajectory of shells when the shell-model is used ",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="angstrom",error=error)
+ filename="",unit_str="angstrom")
CALL add_format_keyword(keyword, print_key, pos=.TRUE.,&
- description="Specifies the format of the output file for the trajectory of shells.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the trajectory of shells.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CORE_TRAJECTORY",&
description="Controls the output of the trajectory of cores when the shell-model is used ",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="angstrom",error=error)
+ filename="",unit_str="angstrom")
CALL add_format_keyword(keyword, print_key, pos=.TRUE.,&
- description="Specifies the format of the output file for the trajectory of cores.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the trajectory of cores.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CELL",&
description="Controls the output of the simulation cell. "//&
"For later analysis of the trajectory it is recommendable that the "//&
"frequency of printing is the same as the one used for the trajectory file.",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"VELOCITIES",&
description="Controls the output of the velocities."//newline//&
@@ -110,99 +106,99 @@ SUBROUTINE create_motion_print_section(section,error)
"Having an atom with a mass m in AMU the kinetic energy 1/2mv^2 will be obtained "//&
"in Hartree (i.e. au) multiplying by 911.447 .",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="bohr*au_t^-1",error=error)
+ filename="",unit_str="bohr*au_t^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the velocities.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the velocities.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SHELL_VELOCITIES",&
description="Controls the output of the velocities of shells when the shell model is used",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="bohr*au_t^-1",error=error)
+ filename="",unit_str="bohr*au_t^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the velocities of shells.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the velocities of shells.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CORE_VELOCITIES",&
description="controls the output of the velocities of cores when the shell model is used",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="bohr*au_t^-1",error=error)
+ filename="",unit_str="bohr*au_t^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the velocities of cores.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the velocities of cores.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_structure_data_section(print_key, error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL create_structure_data_section(print_key)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FORCE_MIXING_LABELS",&
description="Controls the output of the force mixing (FORCE_EVAL&QMMM&FORCE_MIXING) labels",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
+ filename="")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the force mixing labels.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the force mixing labels.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"FORCES",&
description="Controls the output of the forces",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="hartree*bohr^-1",error=error)
+ filename="",unit_str="hartree*bohr^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the forces.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the forces.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SHELL_FORCES",&
description="controls the output of the forces on shells when shell-model is used",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="hartree*bohr^-1",error=error)
+ filename="",unit_str="hartree*bohr^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the forces on shells.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the forces on shells.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CORE_FORCES",&
description="controls the output of the forces on cores when shell-model is used",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",unit_str="hartree*bohr^-1",error=error)
+ filename="",unit_str="hartree*bohr^-1")
CALL add_format_keyword(keyword, print_key, pos=.FALSE.,&
- description="Specifies the format of the output file for the forces on cores.", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ description="Specifies the format of the output file for the forces on cores.")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"MIXED_ENERGIES",&
description="Controls the output of the energies of the two"//&
"regular FORCE_EVALS in the MIXED method"//&
"printed is step,time,Etot,E_F1,E_F2,CONS_QNT",&
print_level=low_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"STRESS",&
description="Controls the output of the stress tensor",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART",&
description="Controls the dumping of the restart file during runs. "//&
"By default keeps a short history of three restarts. See also RESTART_HISTORY", &
each_iter_names=s2a("MD"),each_iter_values=(/20/), &
print_level=silent_print_level, common_iter_levels=1, &
- add_last=add_last_numeric, filename="",error=error)
+ add_last=add_last_numeric, filename="")
CALL keyword_create(keyword, name="BACKUP_COPIES",&
description="Specifies the maximum number of backup copies.",&
usage="BACKUP_COPIES {int}",&
- default_i_val=3, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SPLIT_RESTART_FILE",&
description="If specified selected input sections, which are growing with the "//&
@@ -213,22 +209,21 @@ SUBROUTINE create_motion_print_section(section,error)
"systems with a very large number of atoms",&
usage="SPLIT_RESTART_FILE yes",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART_HISTORY",&
description="Dumps unique restart files during the run keeping all of them."//&
"Most useful if recovery is needed at a later point.",&
print_level=low_print_level, common_iter_levels=0, &
each_iter_names=s2a("MD","GEO_OPT","ROT_OPT"),each_iter_values=(/500,500,500/), &
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"TRANSLATION_VECTOR",&
@@ -236,9 +231,9 @@ SUBROUTINE create_motion_print_section(section,error)
" for postprocessing of QMMM trajectories in which the QM fragment is continuously"//&
" centered in the QM box",&
print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_motion_print_section
@@ -249,16 +244,13 @@ END SUBROUTINE create_motion_print_section
!> \param section will contain the pint section
!> \param pos ...
!> \param description ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 10.2008 [tlaino]
! *****************************************************************************
- SUBROUTINE add_format_keyword(keyword, section, pos, description, error)
+ SUBROUTINE add_format_keyword(keyword, section, pos, description)
TYPE(keyword_type), POINTER :: keyword
TYPE(section_type), POINTER :: section
LOGICAL, INTENT(IN) :: pos
CHARACTER(LEN=*), INTENT(IN) :: description
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'add_format_keyword', &
routineP = moduleN//':'//routineN
@@ -266,8 +258,8 @@ SUBROUTINE add_format_keyword(keyword, section, pos, description, error)
LOGICAL :: failure
failure = .FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(.NOT.ASSOCIATED(keyword),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(.NOT.ASSOCIATED(keyword),cp_failure_level,routineP,failure)
IF (pos) THEN
@@ -283,33 +275,32 @@ SUBROUTINE add_format_keyword(keyword, section, pos, description, error)
"the xy plane. This allows the reconstruction of scaled coordinates from the DCD data only.",&
"Write the atomic information in PDB format to a formatted file",&
"Mostly known as XYZ format, provides in a formatted file: element_symbol X Y Z",&
- "Alias name for XMOL"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Alias name for XMOL"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_OCCUP",&
variants=(/"CHARGE_O"/),&
description="Write the MM charges to the OCCUP field of the PDB file",&
usage="CHARGE_OCCUP logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_BETA",&
variants=(/"CHARGE_B"/),&
description="Write the MM charges to the BETA field of the PDB file",&
usage="CHARGE_BETA logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_EXTENDED",&
description="Write the MM charges to the very last field of the PDB file (starting from column 81)",&
usage="CHARGE_EXTENDED logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
ELSE
@@ -321,10 +312,9 @@ SUBROUTINE add_format_keyword(keyword, section, pos, description, error)
enum_desc=s2a("Write only the coordinates X,Y,Z without element symbols to a formatted file",&
"Write the coordinates (no element labels) and the cell information to a binary file",&
"Mostly known as XYZ format, provides in a formatted file: element_symbol X Y Z",&
- "Alias name for XMOL"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Alias name for XMOL"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END IF
diff --git a/src/input_cp2k_mp2.F b/src/input_cp2k_mp2.F
index da8b41dff9..b21d1d4ad7 100644
--- a/src/input_cp2k_mp2.F
+++ b/src/input_cp2k_mp2.F
@@ -53,13 +53,10 @@ MODULE input_cp2k_mp2
! *****************************************************************************
!> \brief creates the input section for the mp2 part
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MDB
! *****************************************************************************
- SUBROUTINE create_mp2_section(section,error)
+ SUBROUTINE create_mp2_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mp2_section', &
routineP = moduleN//':'//routineN
@@ -70,12 +67,11 @@ SUBROUTINE create_mp2_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"WF_CORRELATION",&
description="Sets up the Wavefunction-based Correlation parameters if requested ",&
n_keywords=8, n_subsections=6, repeats=.TRUE., &
- citations=(/DelBen2012,DelBen2013,DelBen2015/),&
- error=error)
+ citations=(/DelBen2012,DelBen2013,DelBen2015/))
NULLIFY(keyword, print_key, subsection)
@@ -96,39 +92,36 @@ SUBROUTINE create_mp2_section(section,error)
"Use the GPW approach to RI-RPA",&
"Use the GPW approach to RI-SOS-Laplace-MP2",&
"Optimize RIMP2 basis set"),&
- default_i_val=mp2_method_direct, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=mp2_method_direct)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
name="MEMORY",&
description="Maximum allowed total memory usage during MP2 methods [MiB].",&
usage="MEMORY 1500 ",&
- default_r_val=1.024E+3_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.024E+3_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
name="SCALE_S",&
description="Scaling factor of the singlet energy component (opposite spin, OS). ",&
usage="SCALE_S 1.0",&
- default_r_val=1.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
name="SCALE_T",&
description="Scaling factor of the triplet energy component (same spin, SS).",&
usage="SCALE_T 1.0",&
- default_r_val=1.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -138,10 +131,9 @@ SUBROUTINE create_mp2_section(section,error)
"A smaller group size (for example the node size), might a better choice if the actual MP2 time is large "//&
"compared to integral computation time. This is usually the case if the total number of processors is not too large.",&
usage="GROUP_SIZE 32",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -151,10 +143,9 @@ SUBROUTINE create_mp2_section(section,error)
"Default is (ROW_BLOCK=-1) is automatic. "//&
"A proper choice can speedup the parallel matrix multiplication in the case of RI-RPA and RI-SOS-MP2-Laplace.",&
usage="ROW_BLOCK 512",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -164,10 +155,9 @@ SUBROUTINE create_mp2_section(section,error)
"Default is (COL_BLOCK=-1) is automatic. "//&
"A proper choice can speedup the parallel matrix multiplication in the case of RI-RPA and RI-SOS-MP2-Laplace.",&
usage="COL_BLOCK 512",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -176,49 +166,47 @@ SUBROUTINE create_mp2_section(section,error)
description="Calculate the condition number of the (P|Q) matrix for the RI methods.",&
usage="CALC_COND_NUM",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"MP2_INFO",&
description="Controls the printing basic info about MP2 method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_mp2_direct(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mp2_direct(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_wfc_gpw(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_wfc_gpw(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_ri_mp2(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ri_mp2(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_opt_ri_basis(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_opt_ri_basis(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_ri_rpa(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ri_rpa(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_ri_laplace(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ri_laplace(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_cphf(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_cphf(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_mp2_potential(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mp2_potential(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_mp2_section
@@ -226,11 +214,9 @@ END SUBROUTINE create_mp2_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_mp2_direct(section,error)
+ SUBROUTINE create_mp2_direct(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mp2_direct', &
routineP = moduleN//':'//routineN
@@ -240,11 +226,10 @@ SUBROUTINE create_mp2_direct(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"DIRECT_CANONICAL",&
description="Parameters influencing the direct canonical method",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
@@ -254,10 +239,9 @@ SUBROUTINE create_mp2_direct(section,error)
description="Send big messages between processes (useful for >48 processors).",&
usage="BIG_SEND",&
default_l_val=.TRUE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mp2_direct
@@ -265,11 +249,9 @@ END SUBROUTINE create_mp2_direct
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ri_mp2(section,error)
+ SUBROUTINE create_ri_mp2(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ri_mp2', &
routineP = moduleN//':'//routineN
@@ -279,12 +261,11 @@ SUBROUTINE create_ri_mp2(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"RI_MP2",&
description="Parameters influencing the RI MP2 method",&
n_keywords=3, n_subsections=0, repeats=.FALSE., &
- citations=(/DelBen2013/),&
- error=error)
+ citations=(/DelBen2013/))
NULLIFY(keyword)
@@ -293,10 +274,9 @@ SUBROUTINE create_ri_mp2(section,error)
description="Determines the blocking used for communication in RI-MP2. Larger BLOCK_SIZE "//&
"reduces communication but requires more memory. The default (-1) is automatic.",&
usage="BLOCK_SIZE 2",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CANONICAL",&
description="Threshold for discriminate if a given ij pairs "//&
@@ -304,9 +284,9 @@ SUBROUTINE create_ri_mp2(section,error)
"calculated with a canonical reformulation based "//&
"on the occupied eigenvalues differences.",&
usage="EPS_CANONICAL 1.0E-8",type_of_var=real_t,&
- default_r_val=1.0E-7_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-7_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -316,10 +296,9 @@ SUBROUTINE create_ri_mp2(section,error)
"case, the buffers are released by default. (Right now debugging only).",&
usage="FREE_HFX_BUFFER",&
default_l_val=.TRUE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ri_mp2
@@ -327,11 +306,9 @@ END SUBROUTINE create_ri_mp2
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_opt_ri_basis(section,error)
+ SUBROUTINE create_opt_ri_basis(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_opt_ri_basis', &
routineP = moduleN//':'//routineN
@@ -341,14 +318,13 @@ SUBROUTINE create_opt_ri_basis(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"OPT_RI_BASIS",&
description="Parameters influencing the optimization of the RI MP2 basis. "//&
"Only exponents of non-contracted auxiliary basis can be optimized. "//&
"An initial RI auxiliary basis has to be specified.",&
n_keywords=6, n_subsections=0, repeats=.FALSE., &
- citations=(/DelBen2013/),&
- error=error)
+ citations=(/DelBen2013/))
NULLIFY(keyword)
@@ -357,20 +333,18 @@ SUBROUTINE create_opt_ri_basis(section,error)
description="Target accuracy in the relative deviation of the amplitudes calculated with "//&
"and without RI approximation, (more details in Chem.Phys.Lett.294(1998)143).",&
usage="DELTA_I_REL 1.0E-6_dp",&
- default_r_val=1.0E-6_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA_RI",&
variants=(/"DRI"/),&
description="Target accuracy in the absolute difference between the RI-MP2 "//&
"and the exact MP2 energy, DRI=ABS(E_MP2-E_RI-MP2).",&
usage="DELTA_RI 1.0E-6_dp",&
- default_r_val=5.0E-6_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=5.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_DERIV",&
variants=(/"EPS_NUM_DERIV"/),&
@@ -379,28 +353,26 @@ SUBROUTINE create_opt_ri_basis(section,error)
"The change in the exponent a_i employed for the numerical evaluation "//&
"is defined as h_i=EPS_DERIV*a_i.",&
usage="EPS_DERIV 1.0E-3_dp",&
- default_r_val=1.0E-3_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-3_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER",&
variants=(/"MAX_NUM_ITER"/),&
description="Specifies the maximum number of steps in the RI basis optimization.",&
usage="MAX_ITER 100",&
- default_i_val=50,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_FUNC",&
description="Specifies the number of function, for each angular momentum (s, p, d ...), "//&
"employed in the automatically generated initial guess. "//&
"This will be effective only if RI_AUX_BASIS_SET in the KIND section is not specified.",&
usage="NUM_FUNC {number of s func.} {number of p func.} ...", &
- n_var=-1, default_i_vals=(/-1/), type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, default_i_vals=(/-1/), type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="BASIS_SIZE",&
description="Specifies the size of the auxiliary basis set automatically "//&
@@ -409,9 +381,9 @@ SUBROUTINE create_opt_ri_basis(section,error)
usage="BASIS_SIZE (MEDIUM|LARGE|VERY_LARGE)",&
enum_c_vals=s2a("MEDIUM","LARGE","VERY_LARGE"),&
enum_i_vals=(/0,1,2/),&
- default_i_val=0, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_opt_ri_basis
@@ -419,11 +391,9 @@ END SUBROUTINE create_opt_ri_basis
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ri_laplace(section,error)
+ SUBROUTINE create_ri_laplace(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ri_laplace', &
routineP = moduleN//':'//routineN
@@ -433,12 +403,11 @@ SUBROUTINE create_ri_laplace(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"RI_LAPLACE",&
description="Parameters influencing the RI-SOS-MP2-Laplace method",&
n_keywords=2, n_subsections=0, repeats=.FALSE., &
- citations=(/DelBen2013/),&
- error=error)
+ citations=(/DelBen2013/))
NULLIFY(keyword)
@@ -446,10 +415,9 @@ SUBROUTINE create_ri_laplace(section,error)
variants=(/"LAPLACE_NUM_QUAD_POINTS"/),&
description="Number of quadrature points for the numerical integration in the RI-SOS-MP2-Laplace method.",&
usage="QUADRATURE_POINTS 6",&
- default_i_val=5,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIZE_INTEG_GROUP",&
variants=(/"LAPLACE_GROUP_SIZE"/),&
@@ -458,10 +426,9 @@ SUBROUTINE create_ri_laplace(section,error)
"of GROUP_SIZE in the WF_CORRELATION section. The default (-1) "//&
"is automatic.",&
usage="SIZE_INTEG_GROUP 16",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ri_laplace
@@ -469,11 +436,9 @@ END SUBROUTINE create_ri_laplace
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ri_rpa(section,error)
+ SUBROUTINE create_ri_rpa(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ri_rpa', &
routineP = moduleN//':'//routineN
@@ -484,12 +449,11 @@ SUBROUTINE create_ri_rpa(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"RI_RPA",&
description="Parameters influencing the RI RPA method",&
n_keywords=2, n_subsections=1, repeats=.FALSE., &
- citations=(/DelBen2013,DelBen2015/),&
- error=error)
+ citations=(/DelBen2013,DelBen2015/))
NULLIFY(keyword,subsection)
@@ -497,10 +461,9 @@ SUBROUTINE create_ri_rpa(section,error)
variants=(/"RPA_NUM_QUAD_POINTS"/),&
description="Number of quadrature points for the numerical integration in the RI-RPA method.",&
usage="QUADRATURE_POINTS 60",&
- default_i_val=40,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=40)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SIZE_FREQ_INTEG_GROUP",&
variants=(/"RPA_GROUP_SIZE"/),&
@@ -509,10 +472,9 @@ SUBROUTINE create_ri_rpa(section,error)
"of GROUP_SIZE in the WF_CORRELATION section. The default (-1) "//&
"is automatic.",&
usage="SIZE_FREQ_INTEG_GROUP 16",&
- default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="MM_STYLE",&
@@ -522,9 +484,9 @@ SUBROUTINE create_ri_rpa(section,error)
enum_i_vals=(/wfc_mm_style_gemm,wfc_mm_style_syrk/),&
enum_desc=s2a("Use pdgemm: more flops, maybe faster.",&
"Use pdysrk: fewer flops, maybe slower."),&
- default_i_val=wfc_mm_style_gemm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=wfc_mm_style_gemm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -534,10 +496,9 @@ SUBROUTINE create_ri_rpa(section,error)
"Maximum number of quadrature point limited to 20.",&
usage="MINIMAX_QUADRATURE",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -546,21 +507,20 @@ SUBROUTINE create_ri_rpa(section,error)
description="Decide whether to perform an RI_G0W0 calculation on top of RI_ RPA.",&
usage="RI_G0W0",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! here we generate a hfx subsection to use in the case EXX has to be computed after RPA
- CALL create_hfx_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_hfx_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! here we generate a G0W0 subsection to use if G0W0 is desired
- CALL create_ri_g0w0(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ri_g0w0(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_ri_rpa
@@ -568,11 +528,9 @@ END SUBROUTINE create_ri_rpa
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_ri_g0w0(section,error)
+ SUBROUTINE create_ri_g0w0(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ri_g0w0', &
routineP = moduleN//':'//routineN
@@ -582,12 +540,11 @@ SUBROUTINE create_ri_g0w0(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"RI_G0W0",&
description="Parameters influencing the RI-G0W0 method",&
n_keywords=12, n_subsections=0, repeats=.FALSE., &
- citations=(/DelBen2013/),&
- error=error)
+ citations=(/DelBen2013/))
NULLIFY(keyword)
@@ -600,10 +557,9 @@ SUBROUTINE create_ri_g0w0(section,error)
"want to correct all occ. MOs, insert a number larger than the number "//&
"of occ. MOs.",&
usage="CORR_OCC 3",&
- default_i_val=10,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=10)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORR_MOS_VIRT",&
variants=(/"CORR_VIRT"/),&
@@ -614,10 +570,9 @@ SUBROUTINE create_ri_g0w0(section,error)
"want to correct all virt. MOs, insert a number larger than the number "//&
"of virt. MOs.",&
usage="CORR_VIRT 3",&
- default_i_val=10,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=10)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALING",&
variants=(/"A_SCALING"/),&
@@ -626,38 +581,34 @@ SUBROUTINE create_ri_g0w0(section,error)
"choice seems to be 0.2. The grid points of the frequency grid are "//&
"just multiplied by SCALING: omega_j = omega_j*Scaling.",&
usage="SCALING 0.2",&
- default_r_val=0.2_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUMB_POLES",&
description="Number of poles for the fitting. Usually, two poles are sufficient. ",&
usage="NUMB_POLES 2",&
- default_i_val=2,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OMEGA_MAX_FIT",&
description="Determines fitting range for the self-energy on the imaginary axis: "//&
"[0, OMEGA_MAX_FIT] for virt orbitals, [-OMEGA_MAX_FIT,0] for occ orbitals. "//&
"Unit: Hartree. Default: 0.734996 H = 20 eV. ",&
usage="OMEGA_MAX_FIT 0.5",&
- default_r_val=0.734996_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.734996_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STOP_CRIT",&
variants=(/"STOP_CRIT_1"/),&
description="Convergence criterion for the fit. The fitting iteration terminates, if "//&
"chi^2(n+1)/chi^2(n)-1 < STOP_CRIT.",&
usage="STOP_CRIT 1.0E-7",&
- default_r_val=1E-5_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1E-5_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRINT_FIT_ERROR",&
variants=(/"FIT_ERROR"/),&
@@ -665,28 +616,25 @@ SUBROUTINE create_ri_g0w0(section,error)
"is very pessimistic (e.g. can be a factor of 10 too large).",&
usage="FIT_ERROR",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER_FIT",&
description="Maximum number of iterations for the Levenberg-Marquard fit.",&
usage="MAX_ITER_FIT 10000",&
- default_i_val=10000,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=10000)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHECK_FIT",&
description="If true, the self-energy on the imaginary axis and the fit are printed"//&
"the file self_energy_of_MO__for_imaginary_frequency.",&
usage="CHECK_FIT",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CROSSING_SEARCH",&
description="Determines, how the self_energy is evaluated on the real axis.",&
@@ -695,9 +643,9 @@ SUBROUTINE create_ri_g0w0(section,error)
enum_i_vals=(/ri_rpa_g0w0_crossing_none,ri_rpa_g0w0_crossing_z_shot/),&
enum_desc=s2a("Evaluate the correlation self-energy at the energy eigenvalue of SCF.",&
"Calculate the derivative of Sigma and out of it Z. Then extrapolate using Z"),&
- default_i_val=ri_rpa_g0w0_crossing_z_shot, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=ri_rpa_g0w0_crossing_z_shot)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FERMI_LEVEL_OFFSET",&
description="Fermi level for occ. orbitals: e_HOMO + FERMI_LEVEL_OFFSET; "//&
@@ -705,59 +653,54 @@ SUBROUTINE create_ri_g0w0(section,error)
"In case e_homo + FERMI_LEVEL_OFFSET < e_lumo - FERMI_LEVEL_OFFSET,"//&
"we set Fermi level = (e_HOMO+e_LUMO)/2",&
usage="FERMI_LEVEL_OFFSET 1.0E-2",&
- default_r_val=2.0E-2_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=2.0E-2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CUTOFF_RADIUS",&
description="Cutoff radius for the truncated Coulomb potential in GW in Angstrom. "//&
"The cell length seems to be a good choice for the truncation.",&
usage="CUTOFF_RADIUS 6.0",&
default_r_val=10.0_dp,&
- unit_str="angstrom",error=error)
+ unit_str="angstrom")
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRUNCATION",&
description="If true, the Coulomb potential is truncated. Recommended for periodic"//&
"systems.",&
usage="TRUNCATION",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EV_SC_ITER",&
description="Number of iterations for eigenvalue self-consistency cycle. The "//&
"computational effort of RPA and GW scales linearly with this number.",&
usage="EV_SC_ITER 3",&
- default_i_val=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HF_LIKE_EV_START",&
description="If true, take as input for GW/RPA corrected HF-like eigenvalues according "//&
"to PRB 83, 115103 (2011), Sec. IV.",&
usage="HF_LIKE_EV_START",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRINT_GW_DETAILS",&
description="If true, prints additional information on the quasiparticle energies.",&
usage="PRINT_GW_DETAILS",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_ri_g0w0
@@ -765,11 +708,9 @@ END SUBROUTINE create_ri_g0w0
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_wfc_gpw(section,error)
+ SUBROUTINE create_wfc_gpw(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_wfc_gpw', &
routineP = moduleN//':'//routineN
@@ -779,50 +720,48 @@ SUBROUTINE create_wfc_gpw(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"WFC_GPW",&
description="Parameters for the GPW approach in Wavefunction-based Correlation methods",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="EPS_GRID",&
description="Determines a threshold for the GPW based integration",&
usage="EPS_GRID 1.0E-9 ",type_of_var=real_t,&
- default_r_val=1.0E-8_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-8_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_FILTER",&
description="Determines a threshold for the DBCSR based multiply (usually 10 times smaller than EPS_GRID).",&
usage="EPS_FILTER 1.0E-10 ",type_of_var=real_t,&
- default_r_val=1.0E-9_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-9_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CUTOFF",&
description="The cutoff of the finest grid level in the MP2 gpw integration.",&
usage="CUTOFF 300",type_of_var=real_t,&
- default_r_val=300.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=300.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REL_CUTOFF",&
variants=(/"RELATIVE_CUTOFF"/),&
description="Determines the grid at which a Gaussian is mapped.",&
usage="REL_CUTOFF 50",type_of_var=real_t,&
- default_r_val=50.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=50.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MULTIPOLE_TWO_CENT_INT",&
description="Use fast algorithm to calculate two-center RI integrals based on multipole expansion",&
usage="MULTIPOLE_TWO_CENT_INT",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRINT_LEVEL",&
variants=(/"IOLEVEL"/),&
@@ -834,9 +773,9 @@ SUBROUTINE create_wfc_gpw(section,error)
"Little output", "Quite some output", "Lots of output",&
"Everything is written out, useful for debugging purposes only"),&
enum_i_vals=(/silent_print_level,low_print_level,medium_print_level,&
- high_print_level,debug_print_level/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ high_print_level,debug_print_level/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_wfc_gpw
@@ -844,11 +783,9 @@ END SUBROUTINE create_wfc_gpw
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_cphf(section,error)
+ SUBROUTINE create_cphf(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_cphf', &
routineP = moduleN//':'//routineN
@@ -858,12 +795,11 @@ SUBROUTINE create_cphf(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"CPHF",&
description="Parameters influencing the solution of the Z-vector equations in MP2 gradients calculations.",&
n_keywords=2, n_subsections=0, repeats=.FALSE., &
- citations=(/DelBen2013/),&
- error=error)
+ citations=(/DelBen2013/))
NULLIFY(keyword)
@@ -871,19 +807,18 @@ SUBROUTINE create_cphf(section,error)
variants=(/"MAX_NUM_ITER"/),&
description="Maximum number of iterations allowed for the solution of the Z-vector equations.",&
usage="MAX_ITER 50",&
- default_i_val=30,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=30)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_CONV",&
description="Convergence threshold for the solution of the Z-vector equations. "//&
"The Z-vector equations have the form of a linear system of equations Ax=b, "//&
"convergence is achieved when |Ax-b|<=EPS_CONV.",&
usage="EPS_CONV 1.0E-6",type_of_var=real_t,&
- default_r_val=1.0E-4_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_cphf
@@ -891,11 +826,9 @@ END SUBROUTINE create_cphf
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_mp2_potential(section,error)
+ SUBROUTINE create_mp2_potential(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mp2_potential', &
routineP = moduleN//':'//routineN
@@ -905,11 +838,10 @@ SUBROUTINE create_mp2_potential(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"INTERACTION_POTENTIAL",&
description="Parameters the interaction potential in computing the biel integrals",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(&
@@ -928,18 +860,18 @@ SUBROUTINE create_mp2_potential(section,error)
"(6-3*s - 4*n + n^2)*(x - Rc)^4/(Rc^5*(n^4 - 4*n^3 + 6*n^2 - 4*n + 1)) "//&
"for Rc < x ≤ n*Rc (4th order polynomial)"//&
"0 for x > n*Rc"),&
- default_i_val=do_hfx_potential_coulomb, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_hfx_potential_coulomb)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TRUNCATION_RADIUS",&
description="Determines truncation radius for the truncated TShPSC potential. "//&
"Only valid when doing truncated calculation",&
usage="TRUNCATION_RADIUS 10.0",type_of_var=real_t,&
default_r_val=10.0_dp,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -947,10 +879,9 @@ SUBROUTINE create_mp2_potential(section,error)
description="Location of the file TShPSC.dat that contains the data for the "//&
"evaluation of the TShPSC G0 ",&
usage="TShPSC_DATA t_sh_p_s_c.dat",&
- default_c_val="t_sh_p_s_c.dat",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="t_sh_p_s_c.dat")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mp2_potential
diff --git a/src/input_cp2k_neb.F b/src/input_cp2k_neb.F
index 27f02df79d..182235b5b5 100644
--- a/src/input_cp2k_neb.F
+++ b/src/input_cp2k_neb.F
@@ -55,13 +55,10 @@ MODULE input_cp2k_neb
! *****************************************************************************
!> \brief creates the section for a BAND run
!> \param section will contain the pint section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 09.2006 [tlaino]
! *****************************************************************************
- SUBROUTINE create_band_section(section,error)
+ SUBROUTINE create_band_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_band_section', &
routineP = moduleN//':'//routineN
@@ -72,20 +69,19 @@ SUBROUTINE create_band_section(section,error)
subsubsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="band",&
description="The section that controls a BAND run",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Elber1987,Jonsson1998,Jonsson2000_1,Jonsson2000_2,Wales2004/),&
- error=error)
+ citations=(/Elber1987,Jonsson1998,Jonsson2000_1,Jonsson2000_2,Wales2004/))
NULLIFY(keyword, print_key, subsection, subsubsection)
CALL keyword_create(keyword, name="NPROC_REP",&
description="Specify the number of processors to be used per replica "//&
"environment (for parallel runs)",&
- default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PROC_DIST_TYPE",&
description="Specify the topology of the mapping of processors into replicas.",&
@@ -95,9 +91,9 @@ SUBROUTINE create_band_section(section,error)
enum_desc=s2a( "Interleaved distribution",&
"Blocked distribution"),&
enum_i_vals=(/do_rep_interleaved,do_rep_blocked/),&
- default_i_val=do_rep_blocked, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_rep_blocked)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BAND_TYPE",&
description="Specifies the type of BAND calculation",&
@@ -115,22 +111,21 @@ SUBROUTINE create_band_section(section,error)
"Doubly nudged elastic band",&
"String Method",&
"Elastic band (Hamiltonian formulation)"),&
- enum_i_vals=(/do_b_neb,do_it_neb,do_ci_neb,do_d_neb,do_sm,do_eb/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/do_b_neb,do_it_neb,do_ci_neb,do_d_neb,do_sm,do_eb/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUMBER_OF_REPLICA",&
description="Specify the number of Replica to use in the BAND",&
- default_i_val=10, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=10)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="USE_COLVARS",&
description="Uses a version of the band scheme projected in a subspace of colvars.",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POT_TYPE",&
description="Specifies the type of potential used in the BAND calculation",&
@@ -142,193 +137,187 @@ SUBROUTINE create_band_section(section,error)
enum_desc=s2a( "Full potential (no projections in a subspace of colvars)",&
"Free energy (requires a projections in a subspace of colvars)",&
"Minimum energy (requires a projections in a subspace of colvars)"),&
- enum_i_vals=(/pot_neb_full,pot_neb_fe,pot_neb_me/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/pot_neb_full,pot_neb_fe,pot_neb_me/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROTATE_FRAMES",&
description="Compute at each BAND step the RMSD and rotate the frames in order"//&
" to minimize it.",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALIGN_FRAMES",&
description="Enables the alignment of the frames at the beginning of a BAND calculation. "//&
"This keyword does not affect the rotation of the replicas during a BAND calculation.",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K_SPRING",&
variants=(/"K"/),&
description="Specify the value of the spring constant",&
- default_r_val=0.02_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.02_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Convergence_control
CALL section_create(subsection,name="CONVERGENCE_CONTROL",&
description="Setup parameters to control the convergence criteria for BAND",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="MAX_DR",&
description="Tolerance on the maximum value of the displacement on the BAND.",&
usage="MAX_DR {real}",&
- default_r_val=0.0002_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0002_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_FORCE",&
description="Tolerance on the maximum value of Forces on the BAND.",&
usage="MAX_FORCE {real}",&
- default_r_val=0.00045_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.00045_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMS_DR",&
description="Tolerance on RMS displacements on the BAND.",&
usage="RMS_DR {real}",&
- default_r_val=0.0001_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0001_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMS_FORCE",&
description="Tolerance on RMS Forces on the BAND.",&
usage="RMS_FORCE {real}",&
- default_r_val=0.00030_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=0.00030_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection, subsubsection)
! CI-NEB section
CALL section_create(subsection,name="CI_NEB",&
description="Controls parameters for CI-NEB type calculation only.",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="NSTEPS_IT",&
description="Specify the number of steps of IT-NEB to perform before "//&
"switching on the CI algorithm",&
- default_i_val=5, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! String Method section
CALL section_create(subsection,name="STRING_METHOD",&
description="Controls parameters for String Method type calculation only.",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="SPLINE_ORDER",&
description="Specify the oder of the spline used in the String Method.",&
- default_i_val=1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SMOOTHING",&
description="Smoothing parameter for the reparametrization of the frames.",&
- default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.2_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! Optimization section
CALL section_create(subsection,name="optimize_band",&
description="Specify the optimization method for the band",&
- repeats=.TRUE., error=error)
- CALL create_opt_band_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ repeats=.TRUE.)
+ CALL create_opt_band_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! replica section: to specify coordinates and velocities (possibly) of the
! different replica used in the BAND
CALL section_create(subsection,name="replica",&
description="Specify coordinates and velocities (possibly) of the replica",&
- repeats=.TRUE., error=error)
+ repeats=.TRUE.)
! Colvar
CALL keyword_create(keyword, name="COLLECTIVE",&
description="Specifies the value of the collective variables used in the projected"//&
" BAND method. The order of the values is the order of the COLLECTIVE section in the"//&
" constraints/restraints section",&
usage="COLLECTIVE {real} .. {real}",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
! Coordinates read through an external file
CALL keyword_create(keyword, name="COORD_FILE_NAME",&
description="Name of the xyz file with coordinates (alternative to &COORD section)",&
usage="COORD_FILE_NAME ",&
- default_lc_val="",error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
! Coordinates and velocities
- CALL create_coord_section(subsubsection,"BAND",error=error)
- CALL section_add_subsection(subsection,subsubsection,error=error)
- CALL section_release(subsubsection,error=error)
- CALL create_velocity_section(subsubsection,"BAND",error=error)
- CALL section_add_subsection(subsection,subsubsection,error=error)
- CALL section_release(subsubsection,error=error)
+ CALL create_coord_section(subsubsection,"BAND")
+ CALL section_add_subsection(subsection,subsubsection)
+ CALL section_release(subsubsection)
+ CALL create_velocity_section(subsubsection,"BAND")
+ CALL section_add_subsection(subsection,subsubsection)
+ CALL section_release(subsubsection)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! Print key section
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the BAND run", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
CALL keyword_create(keyword, name="INITIAL_CONFIGURATION_INFO",&
description="Print information for the setup of the initial configuration.",&
usage="INITIAL_CONFIGURATION_INFO ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"convergence_info",&
description="Controls the printing of the convergence criteria during a BAND run", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"replica_info",&
description="Controls the printing of each replica info during a BAND run", &
- print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ENERGY",&
description="Controls the printing of the ENER file in a BAND run", &
print_level=low_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"BANNER",&
description="Controls the printing of the BAND banner", &
print_level=low_print_level, common_iter_levels=1,&
- filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_band_section
! *****************************************************************************
!> \brief creates the optimization section for a BAND run
!> \param section will contain the pint section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino 02.2007 [tlaino]
! *****************************************************************************
- SUBROUTINE create_opt_band_section(section,error)
+ SUBROUTINE create_opt_band_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_opt_band_section', &
routineP = moduleN//':'//routineN
@@ -339,7 +328,7 @@ SUBROUTINE create_opt_band_section(section,error)
subsubsection
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword, print_key, subsection, subsubsection)
CALL keyword_create(keyword, name="OPT_TYPE",&
@@ -350,27 +339,26 @@ SUBROUTINE create_opt_band_section(section,error)
"DIIS"),&
enum_desc=s2a( "Molecular dynamics-based optimizer",&
"Coupled steepest descent / direct inversion in the iterative subspace"),&
- enum_i_vals=(/band_md_opt,band_diis_opt/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/band_md_opt,band_diis_opt/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OPTIMIZE_END_POINTS",&
description="Performs also an optimization of the end points of the band.",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! MD optimization section
CALL section_create(subsection,name="MD",&
description="Activate the MD based optimization procedure for BAND",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="MAX_STEPS",&
description="Specify the maximum number of MD steps",&
- default_i_val=100, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=100)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(&
keyword=keyword,&
@@ -378,154 +366,147 @@ SUBROUTINE create_opt_band_section(section,error)
description="The length of an integration step",&
usage="timestep 1.0",&
default_r_val=cp_unit_to_cp2k(value=0.5_dp,&
- unit_str="fs",&
- error=error),&
- unit_str="fs",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="fs"),&
+ unit_str="fs")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMPERATURE",&
description="Specify the initial temperature",&
default_r_val=cp_unit_to_cp2k(value=0.0_dp,&
- unit_str="K",&
- error=error),&
- unit_str="K",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="K"),&
+ unit_str="K")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
! Temp_control
CALL section_create(subsubsection,name="TEMP_CONTROL",&
description="Setup parameters to control the temperature during a BAND MD run.",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="TEMPERATURE",&
description="Specify the target temperature",&
- type_of_var=real_t,unit_str="K",error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,unit_str="K")
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMP_TOL",&
description="Specify the tolerance on the temperature for rescaling",&
default_r_val=cp_unit_to_cp2k(value=0.0_dp,&
- unit_str="K",&
- error=error),&
- unit_str="K",&
- error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="K"),&
+ unit_str="K")
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMP_TOL_STEPS",&
description="Specify the number of steps to apply a temperature control",&
- default_i_val=0, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
! Vel_control
CALL section_create(subsubsection,name="VEL_CONTROL",&
description="Setup parameters to control the velocity during a BAND MD run.",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="ANNEALING",&
description="Specify the annealing coefficient",&
- default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PROJ_VELOCITY_VERLET",&
description="Uses a Projected Velocity Verlet instead of a normal Velocity Verlet."//&
" Every time the cosine between velocities and forces is < 0 velocities are"//&
" zeroed.",&
usage="PROJ_VELOCITY_VERLET ",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SD_LIKE",&
description="Zeros velocity at each MD step emulating a steepest descent like"//&
"(SD_LIKE) approach",&
usage="SD_LIKE ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
! End of MD
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! DIIS optimization section
CALL section_create(subsection,name="DIIS",&
description="Activate the DIIS based optimization procedure for BAND",&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="MAX_SD_STEPS",&
description="Specify the maximum number of SD steps to perform"//&
" before switching on DIIS (the minimum number will always be equal to N_DIIS).",&
- default_i_val=1, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_STEPS",&
description="Specify the maximum number of optimization steps",&
- default_i_val=100, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=100)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_DIIS",&
variants=(/"NDIIS"/),&
description="Number of history vectors to be used with DIIS",&
usage="N_DIIS 4",&
- default_i_val=7,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=7)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STEPSIZE",&
description="Initial stepsize used for the line search, sometimes this parameter"//&
"can be reduced to stablize DIIS",&
usage="STEPSIZE ",&
- default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_STEPSIZE",&
description="Maximum stepsize used for the line search, sometimes this parameter"//&
"can be reduced to stablize the LS for particularly difficult initial geometries",&
usage="MAX_STEPSIZE ",&
- default_r_val=2.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=2.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NP_LS",&
description="Number of points used in the line search SD.",&
usage="NP_LS ",&
- default_i_val=2,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NO_LS",&
description="Does not perform LS during SD. Useful in combination with a proper STEPSIZE"//&
" for particularly out of equilibrium starting geometries.",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHECK_DIIS",&
description="Performes a series of checks on the DIIS solution in order to accept the DIIS step."//&
" If set to .FALSE. the only check performed is that the angle between the DIIS solution and the"//&
" reference vector is less than Pi/2. Can be useful if many DIIS steps are rejected.",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"diis_info",&
description="Controls the printing of DIIS info during a BAND run", &
- print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_opt_band_section
diff --git a/src/input_cp2k_poisson.F b/src/input_cp2k_poisson.F
index 495c8f6e6e..e3df9a28e7 100644
--- a/src/input_cp2k_poisson.F
+++ b/src/input_cp2k_poisson.F
@@ -87,13 +87,10 @@ MODULE input_cp2k_poisson
! *****************************************************************************
!> \brief Creates the Poisson section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_poisson_section(section,error)
+ SUBROUTINE create_poisson_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_poisson_section', &
routineP = moduleN//':'//routineN
@@ -104,11 +101,10 @@ SUBROUTINE create_poisson_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="poisson",&
description="Sets up the poisson resolutor.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="POISSON_SOLVER",&
@@ -119,9 +115,9 @@ SUBROUTINE create_poisson_section(section,error)
enum_i_vals=(/ pw_poisson_periodic, pw_poisson_analytic, pw_poisson_mt, pw_poisson_multipole, &
pw_poisson_wavelet, pw_poisson_implicit/),&
citations=(/Blochl1995,Martyna1999,Genovese2006,Genovese2007/),&
- default_i_val=pw_poisson_periodic, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=pw_poisson_periodic)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PERIODIC",&
description="Specify the directions on wich apply PBC. Important notice, "//&
@@ -133,41 +129,38 @@ SUBROUTINE create_poisson_section(section,error)
enum_i_vals=(/ use_perd_x, use_perd_y, use_perd_z,&
use_perd_xy, use_perd_xz, use_perd_yz,&
use_perd_xyz, use_perd_none /),&
- default_i_val=use_perd_xyz, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=use_perd_xyz)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_mt_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mt_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_wavelet_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_wavelet_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_multipole_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_multipole_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_ewald_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_ewald_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_implicit_ps_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_implicit_ps_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_poisson_section
! *****************************************************************************
!> \brief Section to set-up parameters for decoupling using the Bloechl scheme
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_multipole_section(section,error)
+ SUBROUTINE create_multipole_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_multipole_section', &
routineP = moduleN//':'//routineN
@@ -178,60 +171,56 @@ SUBROUTINE create_multipole_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="MULTIPOLE",&
description="This section is used to set up the decoupling of QM periodic images with "//&
"the use of density derived atomic point charges.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="RCUT",&
description="Real space cutoff for the Ewald sum.",&
usage="RCUT {real}", n_var=1, type_of_var=real_t,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EWALD_PRECISION",&
description="Precision achieved in the Ewald sum.",&
usage="EWALD_PRECISION {real}", n_var=1, type_of_var=real_t,&
- unit_str="hartree",default_r_val=1.0E-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="hartree",default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ANALYTICAL_GTERM",&
description="Evaluates the Gterm in the Ewald Scheme analytically instead of using Splines.",&
usage="ANALYTICAL_GTERM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGRIDS",&
description="Specifies the number of grid points used for the Interpolation of the G-space term",&
- usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_gspace_interp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gspace_interp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,"check_spline",&
description="Controls the checking of the G-space term Spline Interpolation.",&
- print_level=medium_print_level,filename="GSpace-SplInterp",&
- error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=medium_print_level,filename="GSpace-SplInterp")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,"program_run_info",&
description="Controls the printing of basic information during the run", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_multipole_section
@@ -239,13 +228,10 @@ END SUBROUTINE create_multipole_section
! *****************************************************************************
!> \brief Creates the Martyna-Tuckerman section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_mt_section(section,error)
+ SUBROUTINE create_mt_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mt_section', &
routineP = moduleN//':'//routineN
@@ -255,46 +241,42 @@ SUBROUTINE create_mt_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="mt",&
description="Sets up parameters of Martyna-Tuckerman poisson solver. "//&
"Note that exact results are only guaranteed if the unit cell is "//&
"twice as large as charge density (and serious artefacts can result "//&
"if the cell is much smaller).",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Martyna1999/),&
- error=error)
+ citations=(/Martyna1999/))
NULLIFY(keyword)
CALL keyword_create(keyword, name="ALPHA",&
description="Convergence parameter ALPHA*RMIN. Default value 7.0",&
usage="ALPHA real",&
- n_var=1,default_r_val=7.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=7.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REL_CUTOFF",&
description="Specify the multiplicative factor for the CUTOFF keyword in MULTI_GRID "//&
" section. The result gives the cutoff at which the 1/r non-periodic FFT3D is evaluated."//&
"Default is 2.0",&
usage="REL_CUTOFF real",&
- n_var=1,default_r_val=2.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=2.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mt_section
! *****************************************************************************
!> \brief ...
!> \param section will contain the ewald section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
-SUBROUTINE create_ewald_section(section,error)
+SUBROUTINE create_ewald_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_ewald_section', &
routineP = moduleN//':'//routineN
@@ -305,12 +287,11 @@ SUBROUTINE create_ewald_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ewald",&
description="Ewald parameters controlling electrostatic only for CLASSICAL MM.",&
n_keywords=7, n_subsections=0, repeats=.FALSE., &
- citations=(/Ewald1921,Darden1993,Essmann1995,Toukmaji1996,Laino2008/),&
- error=error)
+ citations=(/Ewald1921,Darden1993,Essmann1995,Toukmaji1996,Laino2008/))
NULLIFY(keyword,print_key,subsection)
CALL keyword_create(keyword, name="EWALD_TYPE",&
@@ -329,10 +310,9 @@ SUBROUTINE create_ewald_section(section,error)
enum_desc=s2a("NONE standard real-space coulomb potential is computed together with the non-bonded contributions",&
"EWALD is the standard non-fft based ewald",&
"PME is the particle mesh using fft interpolation",&
- "SPME is the smooth particle mesh using beta-Euler splines (recommended)"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "SPME is the smooth particle mesh using beta-Euler splines (recommended)"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EWALD_ACCURACY",&
description="Expected accuracy in the Ewald sum. This number affects only the calculation of "//&
@@ -341,28 +321,28 @@ SUBROUTINE create_ewald_section(section,error)
"value employed to compute the EWALD real-space term). This keyword has no "//&
"effect on the reciprocal space term (which can be tuned independently).",&
usage="EWALD_ACCURACY {real}", n_var=1, type_of_var=real_t,&
- unit_str="hartree",default_r_val=1.0E-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="hartree",default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Explicitly provide the real-space cutoff of the ewald summation (EWALD|PME|SPME). "//&
"If present, overwrites the estimate of EWALD_ACCURACY and may affect the "//&
"construction of the neighbor lists for non-bonded terms (in FIST), if the value "//&
"specified is larger than the cutoff for non-bonded interactions.",&
- usage="RCUT 5.0", n_var=1, type_of_var=real_t, unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RCUT 5.0", n_var=1, type_of_var=real_t, unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="alpha",&
description="alpha parameter associated with Ewald (EWALD|PME|SPME). "//&
"Recommended for small systems is is alpha = 3.5 / r_cut. "//&
"Tuning alpha, r_cut and gmax is needed to obtain O(N**1.5) scaling for ewald.",&
usage="alpha .30",&
- default_r_val=cp_unit_to_cp2k(value=0.35_dp,unit_str="angstrom^-1", error=error), &
- unit_str='angstrom^-1',error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=0.35_dp,unit_str="angstrom^-1"), &
+ unit_str='angstrom^-1')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="gmax",&
description="number of grid points (SPME and EWALD). If a single number is specified,"// &
@@ -370,45 +350,44 @@ SUBROUTINE create_ewald_section(section,error)
"If three numbers are given, each direction can have a different number of points."// &
"The number of points needs to be FFTable (which depends on the library used) and odd for EWALD."// &
"The optimal number depends e.g. on alpha and the size of the cell. 1 point per Angstrom is common.",&
- usage="gmax 25 25 25", n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="gmax 25 25 25", n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ns_max",&
description="number of grid points on small mesh (PME only), should be odd.",&
- usage="ns_max 11", default_i_val=11,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ns_max 11", default_i_val=11)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="o_spline",&
description="order of the beta-Euler spline (SPME only)",&
- usage="o_spline 6", default_i_val=6,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="o_spline 6", default_i_val=6)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="epsilon",&
description="tolerance of gaussians for fft interpolation (PME only)",&
- usage="epsilon 1e-6", default_r_val=1.e-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="epsilon 1e-6", default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_rsgrid_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rsgrid_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
CALL section_create(subsection,name="MULTIPOLES",&
description="Enables the use of multipoles in the treatment of the electrostatics.",&
n_keywords=0, n_subsections=1, repeats=.FALSE., &
- citations=(/Aguado2003,Laino2008/), error=error)
+ citations=(/Aguado2003,Laino2008/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Controls the activation of the Multipoles",&
- usage="&MULTIPOLES T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="&MULTIPOLES T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_MULTIPOLE_EXPANSION",&
description="Specify the maximum level of multipoles expansion used "//&
@@ -420,9 +399,9 @@ SUBROUTINE create_ewald_section(section,error)
"Use up to the Dipole term",&
"Use up to the Quadrupole term"),&
enum_i_vals=(/ do_multipole_none, do_multipole_charge, do_multipole_dipole,&
- do_multipole_quadrupole/), type_of_var=enum_t, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ do_multipole_quadrupole/), type_of_var=enum_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POL_SCF", &
description="Specify the method to obtain self consistent induced "// &
@@ -436,56 +415,51 @@ SUBROUTINE create_ewald_section(section,error)
"method does not support non-linear polarization "//&
"but is sometimes faster."), &
enum_i_vals=(/ do_fist_pol_none, do_fist_pol_sc, do_fist_pol_cg/), &
- type_of_var=enum_t, default_i_val=do_fist_pol_none, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=enum_t, default_i_val=do_fist_pol_none)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_IPOL_ITER",&
description="Specify the maximum number of iterations for induced "//&
"dipoles",&
usage="MAX_IPOL_ITER {int}", type_of_var=integer_t,&
- n_var=1, default_i_val=0,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_i_val=0)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_POL",&
description="Specify the rmsd threshold for the derivatives "//&
"of the energy towards the Cartesian dipoles components",&
usage="EPS_POL {real}", type_of_var=real_t,&
- n_var=1, default_r_val=0.5e-07_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1, default_r_val=0.5e-07_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="Controls printing of Ewald properties",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="controls the printing of ewald setup",&
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_ewald_section
! *****************************************************************************
!> \brief creates the interpolation section for the periodic QM/MM
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_gspace_interp_section(section,error)
+ SUBROUTINE create_gspace_interp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gspace_interp_section', &
routineP = moduleN//':'//routineN
@@ -496,11 +470,10 @@ SUBROUTINE create_gspace_interp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="interpolator",&
description="controls the interpolation for the G-space term",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, print_key)
@@ -512,10 +485,9 @@ SUBROUTINE create_gspace_interp_section(section,error)
enum_c_vals=s2a( "copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="precond",&
description="The preconditioner used"//&
@@ -525,29 +497,28 @@ SUBROUTINE create_gspace_interp_section(section,error)
enum_c_vals=s2a("copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_x",&
description="accuracy on the solution for spline3 the interpolators",&
- usage="eps_x 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_x 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_r",&
description="accuracy on the residual for spline3 the interpolators",&
- usage="eps_r 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_r 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="max_iter",&
variants=(/'maxiter'/),&
description="the maximum number of iterations",&
- usage="max_iter 200", default_i_val=100, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="max_iter 200", default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"conv_info",&
@@ -555,24 +526,21 @@ SUBROUTINE create_gspace_interp_section(section,error)
" of the spline methods should be printed", &
print_level=medium_print_level,each_iter_names=s2a("SPLINE_FIND_COEFFS"),&
each_iter_values=(/10/),filename="__STD_OUT__",&
- add_last=add_last_numeric,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_gspace_interp_section
! *****************************************************************************
!> \brief Creates the wavelet section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fschiff
!> \note
!> this approach is based on the development of T. Deutsch and S. Goedecker
! *****************************************************************************
- SUBROUTINE create_wavelet_section(section,error)
+ SUBROUTINE create_wavelet_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_wavelet_section', &
routineP = moduleN//':'//routineN
@@ -582,7 +550,7 @@ SUBROUTINE create_wavelet_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="wavelet",&
description="Sets up parameters of wavelet based poisson solver."//&
"This solver allows for non-periodic (PERIODIC NONE) boundary conditions and slab-boundary conditions "//&
@@ -590,8 +558,7 @@ SUBROUTINE create_wavelet_section(section,error)
"It does not require very large unit cells, only that the density goes to zero on the faces of the cell."//&
"The use of PREFERRED_FFT_LIBRARY FFTSG is required",&
n_keywords=1, n_subsections=0, repeats=.FALSE., &
- citations=(/Genovese2006,Genovese2007/),&
- error=error)
+ citations=(/Genovese2006,Genovese2007/))
NULLIFY(keyword)
@@ -600,22 +567,19 @@ SUBROUTINE create_wavelet_section(section,error)
"and the convergence with respect to cutoff depends on the selected scaling functions."//&
"Possible values are 8,14,16,20,24,30,40,50,60,100 ",&
usage="SCF_TYPE integer",&
- n_var=1,default_i_val=40,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_i_val=40)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_wavelet_section
! *****************************************************************************
!> \brief Creates the section for the implicit (generalized) poisson solver
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_implicit_ps_section(section,error)
+ SUBROUTINE create_implicit_ps_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_implicit_ps_section', &
routineP = moduleN//':'//routineN
@@ -626,21 +590,20 @@ SUBROUTINE create_implicit_ps_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="IMPLICIT",&
description="Parameters for the implicit (generalized) Poisson solver.",&
- n_keywords=4, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=4, n_subsections=2, repeats=.FALSE.)
NULLIFY(subsection, keyword)
- CALL create_dielectric_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_dielectric_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_dbc_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_dbc_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="BOUNDARY_CONDITIONS", &
enum_c_vals=s2a( 'PERIODIC', 'MIXED', 'MIXED_PERIODIC', 'NEUMANN' ), &
@@ -649,33 +612,33 @@ SUBROUTINE create_implicit_ps_section(section,error)
enum_i_vals=(/ PERIODIC_BC, MIXED_BC, MIXED_PERIODIC_BC, NEUMANN_BC /), &
description="Specifies the type of boundary conditions. Dirichlet=fixed value, Neumann=zero normal deriv. "//&
"Mixed boundaries essentially requires FFTW3 so that all grid sizes are FFT-able.", &
- usage="BOUNDARY_CONDITIONS ", default_i_val=PERIODIC_BC, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="BOUNDARY_CONDITIONS ", default_i_val=PERIODIC_BC)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ZERO_INITIAL_GUESS", &
description="Whether or not to use zero potential as initial guess.", &
- usage="ZERO_INITIAL_GUESS ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="ZERO_INITIAL_GUESS ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="max_iter", &
description="Maximum number of iterations.", &
- usage="max_iter ", default_i_val=30, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="max_iter ", default_i_val=30)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="tol", &
description="Stopping tolerance.", &
- usage="tol ", default_r_val=1.0E-8_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="tol ", default_r_val=1.0E-8_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="OR_PARAMETER", variants=s2a('omega'), &
description="Over-relaxation parameter (large epsilon requires smaller omega ~0.1).", &
- usage="OR_PARAMETER ", default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="OR_PARAMETER ", default_r_val=1.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_implicit_ps_section
@@ -684,13 +647,10 @@ END SUBROUTINE create_implicit_ps_section
!> The dielectric constant is defined as a function of electronic density.
!> [see O. Andreussi, I. Dabo, and N. Marzari, J. Chem. Phys., 136, 064102(2012)]
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_dielectric_section(section,error)
+ SUBROUTINE create_dielectric_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dielectric_section', &
routineP = moduleN//':'//routineN
@@ -701,11 +661,10 @@ SUBROUTINE create_dielectric_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="DIELECTRIC", &
description="Parameters for the dielectric constant function.", &
- n_keywords=6, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=6, n_subsections=2, repeats=.FALSE.)
NULLIFY(keyword, subsection)
@@ -713,9 +672,9 @@ SUBROUTINE create_dielectric_section(section,error)
description="Avoid spurious values of the dielectric constant at the ionic core for pseudopotentials "// &
"where the electron density goes to zero at the core (e.g. GTH). "// &
"The correction is based on rho_core.", &
- usage="DIELECTRIC_CORE_CORRECTION ", default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="DIELECTRIC_CORE_CORRECTION ", default_l_val=.TRUE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIELECTRIC_FUNCTION_TYPE", &
enum_c_vals=s2a('density_dependent', 'spatially_dependent', 'spatially_rho_dependent'), &
@@ -726,27 +685,27 @@ SUBROUTINE create_dielectric_section(section,error)
"Various regions with different dielectric constants. The dielectric constant decays to 1.0, "//&
"wherever the electron density is present."),&
description="Preferred type for the dielectric constant function.", &
- usage="DIELECTRIC_FUNCTION_TYPE ", default_i_val=rho_dependent, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="DIELECTRIC_FUNCTION_TYPE ", default_i_val=rho_dependent)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="dielectric_constant", variants=s2a('epsilon'), &
description="Dielectric constant in the bulk of the solvent.", &
- usage="dielectric_constant ", default_r_val=80.0_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="dielectric_constant ", default_r_val=80.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="rho_min", &
description="Lower density threshold.", &
- usage="rho_min ", default_r_val=1.0E-4_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="rho_min ", default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="rho_max", &
description="Upper density threshold.", &
- usage="rho_max ", default_r_val=1.0E-3_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="rho_max ", default_r_val=1.0E-3_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DERIVATIVE_METHOD", &
enum_c_vals=s2a('fft', 'fft_use_deps', 'fft_use_drho', 'cd3', 'cd5', 'cd7'), &
@@ -759,17 +718,17 @@ SUBROUTINE create_dielectric_section(section,error)
"5-point central difference derivative.",&
"7-point central difference derivative (recommended)."),&
description="Preferred method for evaluating the gradient of ln(eps).", &
- usage="DERIVATIVE_METHOD ", default_i_val=derivative_cd7, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="DERIVATIVE_METHOD ", default_i_val=derivative_cd7)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
- CALL create_dielec_aa_cuboidal_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_dielec_aa_cuboidal_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_dielec_xaa_annular_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_dielec_xaa_annular_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_dielectric_section
@@ -777,13 +736,10 @@ END SUBROUTINE create_dielectric_section
! *****************************************************************************
!> \brief Creates the section for creating axis-aligned cuboidal dielectric region.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_dielec_aa_cuboidal_section(section,error)
+ SUBROUTINE create_dielec_aa_cuboidal_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_dielec_aa_cuboidal_section', &
@@ -794,59 +750,55 @@ SUBROUTINE create_dielec_aa_cuboidal_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="DIELEC_AA_CUBOIDAL", &
description="Parameters for creating axis-aligned cuboidal dielectric region.",&
- n_keywords=5, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="dielectric_constant", variants=s2a('epsilon'), &
description="value of the dielectric constant inside the region.", &
- usage="dielectric_constant ", default_r_val=80.0_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="dielectric_constant ", default_r_val=80.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_xtnt", &
description="The X extents of the cuboid.", &
usage="X_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Y_xtnt", &
description="The Y extents of the cuboid.", &
usage="Y_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Z_xtnt", &
description="The Z extents of the cuboid.", &
usage="Z_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_dielec_aa_cuboidal_section
! *****************************************************************************
!> \brief Creates the section for creating x-axis-aligned annular dielectric region.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_dielec_xaa_annular_section(section,error)
+ SUBROUTINE create_dielec_xaa_annular_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_dielec_xaa_annular_section', &
@@ -857,59 +809,55 @@ SUBROUTINE create_dielec_xaa_annular_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="DIELEC_XAA_ANNULAR", &
description="Parameters for creating x-axis-aligned annular dielectric region.",&
- n_keywords=5, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="dielectric_constant", variants=s2a('epsilon'), &
description="value of the dielectric constant inside the region.", &
- usage="dielectric_constant ", default_r_val=80.0_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="dielectric_constant ", default_r_val=80.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_xtnt", &
description="The X extents of the annulus.", &
usage="X_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="base_center", &
description="The y and z coordinates of the annulus' base center.", &
usage="base_center ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="base_radii", &
description="The base radius of the annulus.", &
usage="base_radius ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_dielec_xaa_annular_section
! *****************************************************************************
!> \brief Creates the section for Dirichlet boundary conditions
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_dbc_section(section,error)
+ SUBROUTINE create_dbc_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_dbc_section', &
routineP = moduleN//':'//routineN
@@ -920,11 +868,10 @@ SUBROUTINE create_dbc_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="DIRICHLET_BC", &
description="Parameters for creating Dirichlet type boundary conditions.",&
- n_keywords=1, n_subsections=4, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=4, repeats=.FALSE.)
NULLIFY(keyword)
@@ -932,40 +879,37 @@ SUBROUTINE create_dbc_section(section,error)
description="Print out the coordinates of the vertices defining Dirichlet regions and their "// &
"tessellations (in Angstrom), the values of the electrostatic potential at the regions (in a.u.), "// &
"and their corresponding evaluated Lagrange multipliers.", &
- usage="VERBOSE_OUTPUT ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="VERBOSE_OUTPUT ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_aa_planar_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_aa_planar_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_planar_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_planar_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_xaa_cylindrical_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_xaa_cylindrical_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_aa_cuboidal_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_aa_cuboidal_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_dbc_section
! *****************************************************************************
!> \brief Creates the section for creating axis-aligned planar Dirichlet BC.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_aa_planar_section(section,error)
+ SUBROUTINE create_aa_planar_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_aa_planar_section', &
routineP = moduleN//':'//routineN
@@ -975,89 +919,85 @@ SUBROUTINE create_aa_planar_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="AA_PLANAR", &
description="Parameters for creating axis-aligned planar (rectangular) Dirichlet boundary region.",&
- n_keywords=9, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=9, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="v_D", &
description="value of the potential at the Dirichlet boundary (e.g. gate voltage).", &
- usage="v_D ", unit_str="volt", type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="v_D ", unit_str="volt", type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARALLEL_PLANE", &
enum_c_vals=s2a( 'XY', 'YZ' , 'XZ'), &
enum_i_vals=(/ xy_aligned_rectangle, yz_aligned_rectangle, xz_aligned_rectangle /), &
description="The coordinate plane that the region is parallel to.", &
usage="PARALLEL_PLANE ", &
- type_of_var=enum_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ type_of_var=enum_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERCEPT", &
description="The intercept of the rectangle's plane.", &
usage="INTERCEPT ", unit_str="angstrom", &
- type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_xtnt", &
description="The X extents of the plane.", &
usage="X_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Y_xtnt", &
description="The Y extents of the plane.", &
usage="Y_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Z_xtnt", &
description="The Z extents of the plane.", &
usage="Z_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_PRTN", &
description="The number of partitions in xy, yz or xz directions for tiling the plane.", &
usage="N_PRTN ", &
- n_var=2, default_i_vals=(/1, 1/), error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, default_i_vals=(/1, 1/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SMOOTH", &
description="Whether or not to smoothen (mollify) the dirichlet boundary region to avoid "//&
"possible Gibbs phenomenon.", &
- usage="SMOOTH ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="SMOOTH ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_aa_planar_section
! *****************************************************************************
!> \brief Creates the section for creating axis-aligned planar Dirichlet BC.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_planar_section(section,error)
+ SUBROUTINE create_planar_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_planar_section', &
routineP = moduleN//':'//routineN
@@ -1067,73 +1007,69 @@ SUBROUTINE create_planar_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="PLANAR", &
description="Parameters for creating an arbitrary planar Dirichlet boundary region.",&
- n_keywords=7, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="v_D", &
description="value of the potential at the Dirichlet boundary (e.g. gate voltage).", &
- usage="v_D ", unit_str="volt", type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="v_D ", unit_str="volt", type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="A", &
description="Coordinates of the vertex A.", &
usage="A ", unit_str="angstrom", &
- n_var=3, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B", &
description="Coordinates of the vertex B.", &
usage="B ", unit_str="angstrom", &
- n_var=3, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C", &
description="Coordinates of the vertex C.", &
usage="C ", unit_str="angstrom", &
- n_var=3, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_PRTN", &
description="The number of partitions in the x, y and z directions for tiling the plane.", &
usage="N_PRTN ", &
- n_var=3, default_i_vals=(/1, 1, 1/), error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, default_i_vals=(/1, 1, 1/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SMOOTH", &
description="Whether or not to smoothen (mollify) the dirichlet boundary region to avoid "//&
"possible Gibbs phenomenon.", &
- usage="SMOOTH ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="SMOOTH ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_planar_section
! *****************************************************************************
!> \brief Creates the section for creating x-axis-aligned cylindrical Dirichlet BC.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_xaa_cylindrical_section(section,error)
+ SUBROUTINE create_xaa_cylindrical_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_xaa_cylindrical_section', &
@@ -1144,86 +1080,82 @@ SUBROUTINE create_xaa_cylindrical_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="XAA_CYLINDRICAL", &
description="Parameters for creating x-axis-aligned cylindrical Dirichlet boundary region.",&
- n_keywords=9, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=9, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="v_D", &
description="value of the potential at the Dirichlet boundary (e.g. gate voltage).", &
- usage="v_D ", unit_str="volt", type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="v_D ", unit_str="volt", type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_xtnt", &
description="The X extents of the cylinder.", &
usage="X_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="base_center", &
description="The y and z coordinates of the cylinder's base center.", &
usage="base_center ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="base_radius", &
description="The base radius of the cylinder.", &
- usage="base_radius ", default_r_val=1.0_dp, unit_str="angstrom", error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="base_radius ", default_r_val=1.0_dp, unit_str="angstrom")
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="n_sides", &
description="The number of sides os the n-gonal prism approximating the cylinder.", &
- usage="n_sides ", default_i_val=5, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="n_sides ", default_i_val=5)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="apx_type", &
enum_c_vals=s2a( 'CIRCUMSCRIBED', 'INSCRIBED' ), &
enum_i_vals=(/ CIRCUMSCRIBED, INSCRIBED /), &
description="Specifies the type of the n-gonal prism approximating the cylinder.", &
- usage="apx_type ", default_i_val=CIRCUMSCRIBED, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="apx_type ", default_i_val=CIRCUMSCRIBED)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_PRTN", &
description="The number of partitions in the x, y and z directions for tiling the plane.", &
usage="N_PRTN ", &
- n_var=3, default_i_vals=(/1, 1, 1/), error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, default_i_vals=(/1, 1, 1/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SMOOTH", &
description="Whether or not to smoothen (mollify) the dirichlet boundary region to avoid "//&
"possible Gibbs phenomenon.", &
- usage="SMOOTH ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="SMOOTH ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_xaa_cylindrical_section
! *****************************************************************************
!> \brief Creates the section for creating axis-aligned cuboidal Dirichlet region.
!> \param section the section to be created
-!> \param error cp2k error
-!>
!> \author Mohammad Hossein Bani-Hashemian
! *****************************************************************************
- SUBROUTINE create_aa_cuboidal_section(section,error)
+ SUBROUTINE create_aa_cuboidal_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_aa_cuboidal_section', &
routineP = moduleN//':'//routineN
@@ -1233,60 +1165,59 @@ SUBROUTINE create_aa_cuboidal_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP, error, failure)
+ CPPrecondition(.NOT.ASSOCIATED(section), cp_failure_level, routineP,failure)
CALL section_create(section,name="AA_CUBOIDAL", &
description="Parameters for creating axis-aligned cuboidal region where a fixed voltage is applied.",&
- n_keywords=7, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="v_D", &
description="value of the potential at the Dirichlet boundary (e.g. gate voltage).", &
- usage="v_D ", unit_str="volt", type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="v_D ", unit_str="volt", type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_xtnt", &
description="The X extents of the cuboid.", &
usage="X_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Y_xtnt", &
description="The Y extents of the cuboid.", &
usage="Y_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Z_xtnt", &
description="The Z extents of the cuboid.", &
usage="Z_xtnt ", unit_str="angstrom", &
- n_var=2, type_of_var=real_t, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=2, type_of_var=real_t)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_PRTN", &
description="The number of partitions in the x, y and z directions for partitioning the cuboid.", &
usage="N_PRTN ", &
- n_var=3, default_i_vals=(/1, 1, 1/), error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ n_var=3, default_i_vals=(/1, 1, 1/))
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SMOOTH", &
description="Whether or not to smoothen (mollify) the dirichlet region to avoid "//&
"possible Gibbs phenomenon.", &
- usage="SMOOTH ", default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="SMOOTH ", default_l_val=.FALSE.)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="smoothing_width", variants = s2a('zeta'), &
description="The width of the standard mollifier.", &
- usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="smoothing_width ", unit_str="angstrom", default_r_val=0.2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_aa_cuboidal_section
diff --git a/src/input_cp2k_properties_dft.F b/src/input_cp2k_properties_dft.F
index ba9f7c5c27..3d8d489f50 100644
--- a/src/input_cp2k_properties_dft.F
+++ b/src/input_cp2k_properties_dft.F
@@ -62,13 +62,10 @@ MODULE input_cp2k_properties_dft
! *****************************************************************************
!> \brief Create the PROPERTIES section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_properties_section(section,error)
+ SUBROUTINE create_properties_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_properties_section', &
routineP = moduleN//':'//routineN
@@ -79,45 +76,44 @@ SUBROUTINE create_properties_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PROPERTIES",&
description="This section is used to set up the PROPERTIES calculation.",&
- n_keywords=4, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=4, n_subsections=1, repeats=.FALSE.)
NULLIFY (subsection,keyword)
- CALL create_linres_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_linres_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_et_coupling_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_et_coupling_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_resp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_resp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_atprop_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_atprop_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,name="FIT_CHARGE",&
description="This section is used to print the density derived atomic point charges."//&
"The fit of the charges is controlled through the DENSITY_FITTING section",&
- print_level=high_print_level,filename="__STD_OUT__",error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword, name="TYPE_OF_DENSITY",&
description="Specifies the type of density used for the fitting",&
usage="TYPE_OF_DENSITY (FULL|SPIN)",&
enum_c_vals=s2a("FULL","SPIN"),&
enum_i_vals=(/ do_full_density, do_spin_density/),&
enum_desc=s2a("Full density","Spin density"),&
- default_i_val=do_full_density, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=do_full_density)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_properties_section
@@ -127,13 +123,10 @@ END SUBROUTINE create_properties_section
!> a linear response calculation
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MI
! *****************************************************************************
- SUBROUTINE create_linres_section(section,error)
+ SUBROUTINE create_linres_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_linres_section', &
routineP = moduleN//':'//routineN
@@ -145,31 +138,30 @@ SUBROUTINE create_linres_section(section,error)
failure=.FALSE.
NULLIFY(keyword,subsection,print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="linres",&
description="The linear response is used to calculate one of the "//&
" following properties: nmr, epr, raman, ... ",&
n_keywords=5, n_subsections=2, repeats=.FALSE., &
- citations=(/Putrino2000/),&
- error=error)
+ citations=(/Putrino2000/))
CALL keyword_create(keyword, name="EPS",&
description="target accuracy for the convergence of the conjugate gradient.",&
- usage="EPS 1.e-6", default_r_val=1.e-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS 1.e-6", default_r_val=1.e-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_ITER",&
description="Maximum number of conjugate gradient iteration to be performed for one optimization.",&
- usage="MAX_ITER 200", default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_ITER 200", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_EVERY",&
description="Restart the conjugate gradient after the specified number of iterations.",&
- usage="RESTART_EVERY 200", default_i_val=50,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RESTART_EVERY 200", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PRECONDITIONER",&
description="Type of preconditioner to be used with all minimization schemes. "//&
@@ -192,68 +184,65 @@ SUBROUTINE create_linres_section(section,error)
"Cholesky inversion of S, not as good as FULL_KINETIC, yet equally expensive.",&
"skip preconditioning"),&
enum_i_vals=(/ot_precond_full_all,ot_precond_full_single_inverse,ot_precond_full_single, &
- ot_precond_full_kinetic,ot_precond_s_inverse,ot_precond_none/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ ot_precond_full_kinetic,ot_precond_s_inverse,ot_precond_none/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENERGY_GAP",&
description="Energy gap estimate [a.u.] for preconditioning",&
usage="ENERGY_GAP 0.1",&
- default_r_val=0.2_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.2_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART",&
description="Restart the response calculation if the restart file exists",&
usage="RESTART",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WFN_RESTART_FILE_NAME",&
variants=(/"RESTART_FILE_NAME"/),&
description="Root of the file names where to read the response functions from"//&
"which to restart the calculation of the linear response",&
usage="WFN_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_localize_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_localize_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_current_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_current_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_nmr_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_nmr_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_spin_spin_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_spin_spin_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_epr_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_epr_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_polarizability_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_polarizability_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,"PRINT","printing of information during the linear response calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing of basic iteration information during the LINRES calculation", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESTART",&
description="Controls the dumping of restart file of the response wavefunction."//&
@@ -262,12 +251,12 @@ SUBROUTINE create_linres_section(section,error)
"employed only to restart the same type of LINRES calculation, "//&
"i.e. with the same perturbation.", &
print_level=low_print_level,common_iter_levels=3,each_iter_names=s2a("ITER"),&
- add_last=add_last_numeric,each_iter_values=(/3/),filename="",error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric,each_iter_values=(/3/),filename="")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_linres_section
@@ -276,13 +265,10 @@ END SUBROUTINE create_linres_section
!> calculation of induced current DFPT
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MI/VW
! *****************************************************************************
- SUBROUTINE create_current_section(section,error)
+ SUBROUTINE create_current_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_current_section', &
routineP = moduleN//':'//routineN
@@ -294,21 +280,19 @@ SUBROUTINE create_current_section(section,error)
failure=.FALSE.
NULLIFY(keyword,print_key, subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="current",&
description="The induced current density is calculated by DFPT.",&
n_keywords=4, n_subsections=1, repeats=.FALSE., &
- citations=(/Sebastiani2001,Weber2009/),&
- error=error)
+ citations=(/Sebastiani2001,Weber2009/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the induced current calculation",&
usage="&CURRENT T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="GAUGE",&
description="The gauge used to compute the induced current within GAPW.",&
@@ -318,26 +302,25 @@ SUBROUTINE create_current_section(section,error)
enum_desc=s2a("Position gauge (doesnt work well).",&
"Position and step function for the soft and the local parts, respectively.",&
"Atoms."),&
- enum_i_vals=(/current_gauge_r,current_gauge_r_and_step_func,current_gauge_atom/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/current_gauge_r,current_gauge_r_and_step_func,current_gauge_atom/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GAUGE_ATOM_RADIUS",&
description="Build the gauge=atom using only the atoms within this radius.", &
usage="GAUGE_ATOM_RADIUS 10.0",&
type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=4.0_dp,unit_str="angstrom",error=error),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=4.0_dp,unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="USE_OLD_GAUGE_ATOM",&
description="Use the old way to compute the gauge.", &
usage="USE_OLD_GAUGE_ATOM T",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ORBITAL_CENTER",&
description="The orbital center.",&
@@ -349,127 +332,123 @@ SUBROUTINE create_current_section(section,error)
"Use the atoms as center.",&
"Boxing."),&
enum_i_vals=(/current_orb_center_wannier,current_orb_center_common,&
- current_orb_center_atom,current_orb_center_box/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ current_orb_center_atom,current_orb_center_box/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COMMON_CENTER",&
description="The common center ", usage="COMMON_CENTER 0.0 1.0 0.0",&
n_var=3,default_r_vals=(/0.0_dp,0.0_dp,0.0_dp/),type_of_var=real_t,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NBOX",&
description="How many boxes along each directions ", usage="NBOX 6 6 5",&
- n_var=3,default_i_vals=(/4,4,4/),type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,default_i_vals=(/4,4,4/),type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHI_PBC",&
description="Calculate the succeptibility correction to the shift with PBC",&
usage="CHI_PBC T",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SELECTED_STATES_ON_ATOM_LIST",&
description="Indexes of the atoms for selecting"//&
" the states to be used for the response calculations.",&
usage="SELECTED_STATES_ON_ATOM_LIST 1 2 10",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SELECTED_STATES_ATOM_RADIUS",&
description="Select all the states included in the given radius arround each atoms "//&
"in SELECTED_STATES_ON_ATOM_LIST.",&
usage="SELECTED_STATES_ATOM_RADIUS 2.0",&
type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=4.0_dp,unit_str="angstrom",error=error),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=4.0_dp,unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_CURRENT",&
description="Restart the induced current density calculation"//&
" from a previous run (not working yet).",&
usage="RESTART_CURRENT",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="print results of induced current density calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"CURRENT_CUBES",&
description="Controls the printing of the induced current density (not working yet).", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components (not working yet).",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESPONSE_FUNCTION_CUBES",&
description="Controls the printing of the response functions (not working yet).", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components (not working yet).",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LU_BOUNDS",&
variants=(/"CUBES_LU"/),&
description="The lower and upper index of the states to be printed as cube (not working yet).",&
usage="CUBES_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LIST",&
description="Indexes of the states to be printed as cube files"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes) (not working yet).",&
usage="CUBES_LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_current_section
@@ -480,13 +459,10 @@ END SUBROUTINE create_current_section
!> the induced current obtained from DFPT
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author MI/VW
! *****************************************************************************
- SUBROUTINE create_nmr_section(section,error)
+ SUBROUTINE create_nmr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_nmr_section', &
routineP = moduleN//':'//routineN
@@ -498,139 +474,134 @@ SUBROUTINE create_nmr_section(section,error)
failure=.FALSE.
NULLIFY(keyword,print_key, subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="nmr",&
description="The chemical shift is calculated by DFPT.",&
n_keywords=5, n_subsections=1, repeats=.FALSE., &
- citations=(/Weber2009/),&
- error=error)
+ citations=(/Weber2009/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the nmr calculation",&
usage="&NMR T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTERPOLATE_SHIFT",&
description="Calculate the soft part of the chemical shift by interpolation ",&
usage="INTERPOLATE_SHIFT T",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NICS",&
description="Calculate the chemical shift in a set of points "//&
" given from an external file", usage="NICS",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NICS_FILE_NAME",&
description="Name of the file with the NICS points coordinates",&
usage="NICS_FILE_NAME nics_file",&
- default_lc_val="nics_file",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="nics_file")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_NMR",&
description="Restart the NMR calculation from a previous run (NOT WORKING YET)",&
usage="RESTART_NMR",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SHIFT_GAPW_RADIUS",&
description="While computing the local part of the shift (GAPW), "//&
"the integration is restricted to nuclei that are within this radius.", &
usage="SHIFT_GAPW_RADIUS 20.0",&
type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=60.0_dp,unit_str="angstrom",error=error),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=60.0_dp,unit_str="angstrom"),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="print results of nmr calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"RESPONSE_FUNCTION_CUBES",&
description="Controls the printing of the response functions ", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LU_BOUNDS",&
variants=(/"CUBES_LU"/),&
description="The lower and upper index of the states to be printed as cube",&
usage="CUBES_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LIST",&
description="Indexes of the states to be printed as cube files"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="CUBES_LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"CHI_TENSOR",&
description="Controls the printing of susceptibility",&
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SHIELDING_TENSOR",&
description="Controls the printing of the chemical shift",&
- print_level=low_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword,name="ATOMS_LU_BOUNDS",&
variants=(/"ATOMS_LU"/),&
description="The lower and upper atomic index for which the tensor is printed",&
usage="ATOMS_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS_LIST",&
description="list of atoms for which the shift is printed into a file ",&
usage="LIST_ATOMS 1 2",n_var=-1,&
- type_of_var=integer_t,repeats=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_nmr_section
@@ -640,13 +611,10 @@ END SUBROUTINE create_nmr_section
!> calculation of NMR spin-spin coupling (implementation not operating)
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author VW
! *****************************************************************************
- SUBROUTINE create_spin_spin_section(section,error)
+ SUBROUTINE create_spin_spin_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_spin_spin_section', &
routineP = moduleN//':'//routineN
@@ -658,90 +626,87 @@ SUBROUTINE create_spin_spin_section(section,error)
failure=.FALSE.
NULLIFY(keyword,print_key,subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="spinspin",&
description="Compute indirect spin-spin coupling constants.",&
- n_keywords=5, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=1, repeats=.FALSE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the nmr calculation",&
usage="&SPINSPIN T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_SPINSPIN",&
description="Restart the spin-spin calculation from a previous run (NOT WORKING YET)",&
usage="RESTART_SPINSPIN",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ISSC_ON_ATOM_LIST",&
description="Atoms for which the issc is computed.",&
usage="ISSC_ON_ATOM_LIST 1 2 10",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_FC",&
description="Compute the Fermi contact contribution",&
usage="DO_FC F",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_SD",&
description="Compute the spin-dipolar contribution",&
usage="DO_SD F",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_PSO",&
description="Compute the paramagnetic spin-orbit contribution",&
usage="DO_PSO F",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_DSO",&
description="Compute the diamagnetic spin-orbit contribution (NOT YET IMPLEMENTED)",&
usage="DO_DSO F",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="print results of the indirect spin-spin calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"K_MATRIX",&
description="Controls the printing of the indirect spin-spin matrix",&
- print_level=low_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="ATOMS_LIST",&
description="list of atoms for which the indirect spin-spin is printed into a file ",&
usage="LIST_ATOMS 1 2",n_var=-1,&
- type_of_var=integer_t,repeats=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_spin_spin_section
@@ -752,14 +717,10 @@ END SUBROUTINE create_spin_spin_section
!> the induced current obtained from DFPT
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author VW
! *****************************************************************************
- SUBROUTINE create_epr_section(section,error)
+ SUBROUTINE create_epr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout), &
- OPTIONAL :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_epr_section', &
routineP = moduleN//':'//routineN
@@ -772,124 +733,118 @@ SUBROUTINE create_epr_section(section,error)
failure=.FALSE.
NULLIFY(keyword,print_key, subsection, subsubsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="EPR",&
description="The g tensor is calculated by DFPT ",&
n_keywords=5, n_subsections=1, repeats=.FALSE., &
- citations=(/Weber2009/),&
- error=error)
+ citations=(/Weber2009/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the epr calculation",&
usage="&EPR T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_EPR",&
description="Restart the EPR calculation from a previous run (NOT WORKING)",&
usage="RESTART_EPR",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="print results of epr calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"NABLAVKS_CUBES",&
description="Controls the printing of the components of nabla v_ks ", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"G_TENSOR",&
description="Controls the printing of the g tensor",&
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
- CALL create_xc_section(subsubsection,error)
- CALL section_add_subsection(print_key, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
+ CALL create_xc_section(subsubsection)
+ CALL section_add_subsection(print_key, subsubsection)
+ CALL section_release(subsubsection)
CALL keyword_create(keyword, name="GAPW_MAX_ALPHA",&
description="Maximum alpha of GTH potentials allowed on the soft grids ",&
- usage="GAPW_MAX_ALPHA real", default_r_val=5.0_dp,&
- error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GAPW_MAX_ALPHA real", default_r_val=5.0_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SOO_RHO_HARD",&
description="Whether or not to include the atomic parts of the density "//&
"in the SOO part of the g tensor", usage="SOO_RHO_HARD", &
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESPONSE_FUNCTION_CUBES",&
description="Controls the printing of the response functions ", &
- print_level=high_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=high_print_level,add_last=add_last_numeric,filename="")
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LU_BOUNDS",&
variants=(/"CUBES_LU"/),&
description="The lower and upper index of the states to be printed as cube",&
usage="CUBES_LU_BOUNDS integer integer",&
- n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,default_i_vals=(/0,-2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="CUBES_LIST",&
description="Indexes of the states to be printed as cube files"//&
"This keyword can be repeated several times"//&
"(useful if you have to specify many indexes).",&
usage="CUBES_LIST 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_epr_section
@@ -899,14 +854,11 @@ END SUBROUTINE create_epr_section
!> calculation of polarizability tensor DFPT
!> Available properties : none
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author SL
! *****************************************************************************
- SUBROUTINE create_polarizability_section(section,error)
+ SUBROUTINE create_polarizability_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_polarizability_section', &
@@ -919,51 +871,48 @@ SUBROUTINE create_polarizability_section(section,error)
failure=.FALSE.
NULLIFY(keyword,print_key,subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="POLAR",&
description="Compute polarizabilities.",&
n_keywords=5, n_subsections=1, repeats=.FALSE., &
- citations=(/Putrino2002/),&
- error=error)
+ citations=(/Putrino2002/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the polarizability calculation",&
usage="&POLAR T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DO_RAMAN",&
description="Compute the electric-dipole--electric-dipole polarizability",&
usage="DO_RAMAN F",&
citations=(/Luber2014/),&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
CALL section_create(subsection,name="PRINT",&
description="print results of the polarizability calculation",&
- repeats=.FALSE.,error=error)
+ repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"POLAR_MATRIX",&
description="Controls the printing of the polarizabilities",&
- print_level=low_print_level,add_last=add_last_numeric,filename="",&
- error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="")
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_polarizability_section
@@ -971,13 +920,10 @@ END SUBROUTINE create_polarizability_section
! *****************************************************************************
!> \brief creates the section for electron transfer coupling
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fschiff
! *****************************************************************************
- SUBROUTINE create_et_coupling_section(section,error)
+ SUBROUTINE create_et_coupling_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_et_coupling_section', &
routineP = moduleN//':'//routineN
@@ -988,31 +934,30 @@ SUBROUTINE create_et_coupling_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"ET_COUPLING",&
description="specifies the two constraints/restraints for extracting ET coupling elements",&
- n_keywords=1, n_subsections=4, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=4, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_restraint_A(subsection,"DDAPC_RESTRAINT_A",error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_restraint_A(subsection,"DDAPC_RESTRAINT_A")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_restraint_A(subsection,"DDAPC_RESTRAINT_B",error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_restraint_A(subsection,"DDAPC_RESTRAINT_B")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_restraint_A(subsection,"BECKE_RESTRAINT_A",error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_restraint_A(subsection,"BECKE_RESTRAINT_A")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
NULLIFY(subsection)
- CALL create_restraint_A(subsection,"BECKE_RESTRAINT_B",error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_restraint_A(subsection,"BECKE_RESTRAINT_B")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="TYPE_OF_CONSTRAINT",&
description="Specifies the type of constraint",&
@@ -1020,17 +965,16 @@ SUBROUTINE create_et_coupling_section(section,error)
enum_c_vals=s2a("NONE","DDAPC","BECKE"),&
enum_i_vals=(/ do_no_et, do_et_ddapc, do_et_becke/),&
enum_desc=s2a("NONE","ddapc_restraint","Sperical potential"),&
- default_i_val=do_no_et,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_no_et)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_et_coupling_section
@@ -1038,12 +982,10 @@ END SUBROUTINE create_et_coupling_section
!> \brief ...
!> \param section ...
!> \param section_name ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_restraint_A(section,section_name,error)
+ SUBROUTINE create_restraint_A(section,section_name)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: section_name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_restraint_A', &
routineP = moduleN//':'//routineN
@@ -1054,18 +996,17 @@ SUBROUTINE create_restraint_A(section,section_name,error)
failure=.FALSE.
NULLIFY(keyword, print_key)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,TRIM(ADJUSTL(section_name)),&
description="Use DDAPC charges in a restraint (check code for details),"//&
" section can be repeated, but only one constraint is possible at the moment.",&
- n_keywords=7, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=7, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="STRENGTH",&
description="force constant of the restraint",&
- usage="STRENGTH {real} ",default_r_val=0.1_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRENGTH {real} ",default_r_val=0.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE_OF_DENSITY",&
description="Specifies the type of density used for the fitting",&
@@ -1073,30 +1014,30 @@ SUBROUTINE create_restraint_A(section,section_name,error)
enum_c_vals=s2a("FULL","SPIN"),&
enum_i_vals=(/ do_full_density, do_spin_density/),&
enum_desc=s2a("Full density","Spin density"),&
- default_i_val=do_full_density, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_full_density)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="target value of the restraint",&
- usage="TARGET {real} ",default_r_val=1._dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TARGET {real} ",default_r_val=1._dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies the list of atoms that is summed in the restraint",&
usage="ATOMS {integer} {integer} .. {integer}", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="COEFF",&
description="Defines the the coefficient of the atom in the atom list (default is one), currently DDAPC only ",&
usage="COEFF 1.0 -1.0",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTIONAL_FORM",&
description="Specifies the functional form of the term added",&
@@ -1104,16 +1045,15 @@ SUBROUTINE create_restraint_A(section,section_name,error)
enum_c_vals=s2a("RESTRAINT","CONSTRAINT"),&
enum_i_vals=(/ do_ddapc_restraint, do_ddapc_constraint/),&
enum_desc=s2a("Harmonic potential: s*(q-t)**2","Constraint form: s*(q-t)"),&
- default_i_val=do_ddapc_restraint, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_ddapc_restraint)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"program_run_info",&
description="Controls the printing basic info about the method", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_restraint_A
diff --git a/src/input_cp2k_qmmm.F b/src/input_cp2k_qmmm.F
index b2659187b0..1bee867623 100644
--- a/src/input_cp2k_qmmm.F
+++ b/src/input_cp2k_qmmm.F
@@ -85,13 +85,10 @@ MODULE input_cp2k_qmmm
! *****************************************************************************
!> \brief Creates the QM/MM section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_qmmm_section(section,error)
+ SUBROUTINE create_qmmm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_section', &
routineP = moduleN//':'//routineN
@@ -102,12 +99,11 @@ SUBROUTINE create_qmmm_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="qmmm",&
description="Input for QM/MM calculations.",&
n_keywords=6, n_subsections=3, repeats=.FALSE., &
- citations=(/Laino2005,Laino2006/),&
- error=error)
+ citations=(/Laino2005,Laino2006/))
NULLIFY(keyword, subsection )
CALL keyword_create(keyword, name="E_COUPL",&
@@ -121,17 +117,17 @@ SUBROUTINE create_qmmm_section(section,error)
"Using fast gaussian expansion of the electrostatic potential (Erf(r/rc)/r)",&
"Using fast gaussian expansion of the s-wave electrostatic potential",&
"Using quantum mechanics derived point charges interacting with MM charges"),&
- default_i_val=do_qmmm_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_POTENTIAL_FILE_NAME",&
description="Name of the file containing the potential expansion in gaussians. See the "//&
"USE_GEEP_LIB keyword.",&
usage="MM_POTENTIAL_FILE_NAME {filename}",&
- default_lc_val="MM_POTENTIAL",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_lc_val="MM_POTENTIAL")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="use_geep_lib",&
description=" This keyword enables the use of the internal GEEP library to generate the "//&
@@ -139,9 +135,9 @@ SUBROUTINE create_qmmm_section(section,error)
"the MM_POTENTIAL_FILENAME. It expects a number from 2 to 15 (the number of gaussian funtions"//&
" to be used in the expansion.",&
usage="use_geep_lib INTEGER",&
- default_i_val=0, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=0)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="nocompatibility",&
description="This keyword disables the compatibility of QM/MM "//&
@@ -149,17 +145,17 @@ SUBROUTINE create_qmmm_section(section,error)
" is achieved using an MM potential of the form: Erf[x/rc]/x + (1/rc -2/(pi^1/2*rc))*Exp[-(x/rc)^2] ."//&
"This keyword has effect only selecting GAUSS E_COUPLING type.",&
usage="nocompatibility LOGICAL",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_mm_rspace",&
description="Set the threshold for the collocation of the GEEP gaussian functions."//&
"this keyword affects only the GAUSS E_COUPLING.",&
usage="eps_mm_rspace real",&
- default_r_val=1.0E-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SPHERICAL_CUTOFF",&
description="Set the spherical cutoff for the QMMM electrostatic interaction. "//&
@@ -169,9 +165,9 @@ SUBROUTINE create_qmmm_section(section,error)
"Two values are required: the first one is the distance cutoff. The second one controls "//&
"the stiffness of the smoothing.",&
usage="SPHERICAL_CUTOFF ", default_r_vals=(/-1.0_dp,0.0_dp/), n_var=2,&
- unit_str="angstrom", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="parallel_scheme",&
description="Chooses the parallel_scheme for the long range Potential ",&
@@ -182,9 +178,9 @@ SUBROUTINE create_qmmm_section(section,error)
"with limited memory per core. The grid option may be preferred in this case.",&
"parallelizes on grid slices. atoms replicated."),&
enum_i_vals=(/ do_par_atom, do_par_grid /),&
- default_i_val=do_par_atom, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_par_atom)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Centering keywords
CALL keyword_create(keyword, name="CENTER",&
@@ -196,9 +192,9 @@ SUBROUTINE create_qmmm_section(section,error)
"Center at first step only", &
"Never center"),&
enum_i_vals=(/ do_qmmm_center_every_step, do_qmmm_center_setup_only, do_qmmm_center_never /),&
- default_i_val=do_qmmm_center_every_step, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_center_every_step)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CENTER_TYPE",&
description="This keyword specifies how to do the QM system centering.",&
@@ -207,88 +203,85 @@ SUBROUTINE create_qmmm_section(section,error)
enum_desc=s2a("Center of box defined by maximum coordinate minus minimum coordinate",&
"PBC-aware centering (useful for &QMMM&FORCE_MIXING)"),&
enum_i_vals=(/ do_qmmm_center_max_minus_min, do_qmmm_center_pbc_aware /),&
- default_i_val=do_qmmm_center_max_minus_min, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_center_max_minus_min)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CENTER_GRID",&
description="This keyword specifies whether the QM system is centered in units of the grid spacing.",&
usage="grid_center LOGICAL",&
- default_l_val=.FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="initial_translation_vector",&
description="This keyword specify the initial translation vector to be applied to the system.",&
usage="initial_translation_vector ",&
- n_var=3, default_r_vals=(/0.0_dp, 0.0_dp, 0.0_dp/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3, default_r_vals=(/0.0_dp, 0.0_dp, 0.0_dp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DELTA_CHARGE",&
description="Additional net charge relative to that specified in DFT section. Used automatically by force mixing",&
usage="DELTA_CHARGE q",default_i_val=0,&
- n_var=1,type_of_var=integer_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=integer_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! NB: remember to create these
- CALL create_qmmm_force_mixing_section(subsection, error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_force_mixing_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_qm_kinds(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_qm_kinds(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_mm_kinds(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_mm_kinds(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_cell_section(subsection,periodic=use_perd_none,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_cell_section(subsection,periodic=use_perd_none)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_periodic_section(subsection, error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_periodic_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_link_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_link_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_interp_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_interp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_forcefield_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_forcefield_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_walls_section(subsection, error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_walls_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_qmmm_image_charge_section(subsection, error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_image_charge_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_print_qmmm_section(subsection, error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_qmmm_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_section
! *****************************************************************************
!> \brief Input section to create MM kinds sections
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_mm_kinds(section,error)
+ SUBROUTINE create_qmmm_mm_kinds(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_mm_kinds', &
routineP = moduleN//':'//routineN
@@ -298,44 +291,39 @@ SUBROUTINE create_qmmm_mm_kinds(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="MM_KIND",&
description="Information about the MM kind in the QM/MM scheme",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
- description="The MM kind",usage="O",n_var=1,type_of_var=char_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ description="The MM kind",usage="O",n_var=1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADIUS",&
description="Specifies the radius of the atomic kinds",&
usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom",error=error),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORR_RADIUS",&
description="Specifies the correction radius of the atomic kinds"//&
" The correction radius is connected to the use of the compatibility keyword.",&
- usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_qmmm_mm_kinds
! *****************************************************************************
!> \brief Input section to create FORCE_MIXING sections
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author noam
! *****************************************************************************
- SUBROUTINE create_qmmm_force_mixing_section(section, error)
+ SUBROUTINE create_qmmm_force_mixing_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_qmmm_force_mixing_section', &
@@ -349,7 +337,7 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="FORCE_MIXING",&
description="This section enables and defines parameters for force-mixing based QM/MM,"//&
" which actually does two conventional QM/MM calculations, on a small "//&
@@ -367,14 +355,13 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
" only MOTION&GEO_OPT&TYPE CG, MOTION&GEO_OPT&CG&LINE_SEARCH&TYPE 2PNT, and "//&
" MOTION&GEO_OPT&CG&LINE_SEARCH&2PNT&LINMIN_GRAD_ONLY T",&
n_keywords=5, n_subsections=3, repeats=.FALSE., &
- citations=(/Bernstein2009,Bernstein2012/),&
- error=error)
+ citations=(/Bernstein2009,Bernstein2012/))
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_", &
description="Enables force-mixing", &
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOMENTUM_CONSERVATION_TYPE",&
description="How to apply force to get momentum conservation", &
@@ -384,9 +371,9 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
enum_desc=s2a("No momentum conservation", &
"Equal force on each atom",&
"Equal acceleration on each atom"),&
- default_i_val=do_fm_mom_conserv_equal_a, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_fm_mom_conserv_equal_a)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOMENTUM_CONSERVATION_REGION",&
description="Region to apply correction force to for momentum conservation", &
@@ -396,31 +383,31 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
enum_desc=s2a("Apply to QM core region", &
"Apply to full QM (dynamics) region",&
"Apply to QM+buffer regions"),&
- default_i_val=do_fm_mom_conserv_QM, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_fm_mom_conserv_QM)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R_CORE",&
description="Specify the inner and outer radii of core QM region. "//&
" All molecules with any atoms within this distance (hysteretically) of any atoms "//&
" specified as QM in enclosing QM/MM section will be core QM atoms in the force-mixing calculation.", &
usage="R_CORE ",n_var=2,type_of_var=real_t,&
- default_r_vals=(/ cp_unit_to_cp2k(0.0_dp,"angstrom",error=error),&
- cp_unit_to_cp2k(0.0_dp,"angstrom",error=error) /),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/ cp_unit_to_cp2k(0.0_dp,"angstrom"),&
+ cp_unit_to_cp2k(0.0_dp,"angstrom") /),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R_QM",&
description="Specify the inner and outer radii of QM dynamics region. "//&
" All molecules with atoms within this distance (hysteretically) of any atoms in "//&
" core will follow QM dynamics in the force-mixing calculation.", &
usage="R_QM ",n_var=2,type_of_var=real_t,&
- default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom",error=error),&
- cp_unit_to_cp2k(1.0_dp,"angstrom",error=error) /),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom"),&
+ cp_unit_to_cp2k(1.0_dp,"angstrom") /),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QM_EXTENDED_SEED_IS_ONLY_CORE_LIST",&
description="Makes the extended QM zone be defined hysterestically "//&
@@ -428,83 +415,81 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
" user) instead of from full QM core region (specified by user + hysteretic "//&
" selection + unbreakable bonds)",&
usage="QM_EXTENDED_SEED_IS_ONLY_CORE_LIST ",n_var=1,type_of_var=logical_t,&
- default_l_val=.FALSE., repeats = .FALSE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., repeats = .FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="R_BUF",&
description="Specify the inner and outer radii of buffer region. "//&
" All atoms within this distance (hysteretically) of any QM atoms "//&
" will be buffer atoms in the force-mixing calculation.", &
usage="R_BUF ",n_var=2,type_of_var=real_t,&
- default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom",error=error),&
- cp_unit_to_cp2k(1.0_dp,"angstrom",error=error) /),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom"),&
+ cp_unit_to_cp2k(1.0_dp,"angstrom") /),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QM_KIND_ELEMENT_MAPPING",&
description="Mapping from elements to QM_KINDs for adaptively included atoms.",&
usage="QM_KIND_ELEMENT_MAPPING {El} {QM_KIND}",&
- n_var=2,type_of_var=char_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2,type_of_var=char_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_N_QM",&
description="Maximum number of QM atoms, for detection of runaway adaptive selection.",&
usage="MAX_N_QM int",default_i_val=300,&
- n_var=1,type_of_var=integer_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=integer_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ADAPTIVE_EXCLUDE_MOLECULES",&
description="List of molecule names to exclude from adaptive regions (e.g. big things like proteins)",&
usage="ADAPTIVE_EXCLUDE_MOLECULES molec1 molec2 ...",&
- n_var=-1,type_of_var=char_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXTENDED_DELTA_CHARGE",&
description="Additional net charge in extended region relative to core (core charge is "//&
" specified in DFT section, as usual for a convetional QM/MM calculation)",&
usage="EXTENDED_DELTA_CHARGE q",default_i_val=0,&
- n_var=1,type_of_var=integer_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,type_of_var=integer_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! QM_NON_ADAPTIVE subsection
NULLIFY(subsection)
CALL section_create(subsection,name="QM_NON_ADAPTIVE",&
description="List of atoms always in QM region, non-adaptively",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
NULLIFY(qm_kinds_subsection)
- CALL create_qmmm_qm_kinds(qm_kinds_subsection,error)
- CALL section_add_subsection(subsection,qm_kinds_subsection,error=error)
- CALL section_release(qm_kinds_subsection,error=error)
+ CALL create_qmmm_qm_kinds(qm_kinds_subsection)
+ CALL section_add_subsection(subsection,qm_kinds_subsection)
+ CALL section_release(qm_kinds_subsection)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! BUFFER_NON_ADAPTIVE subsection
NULLIFY(subsection)
CALL section_create(subsection,name="BUFFER_NON_ADAPTIVE",&
description="List of atoms always in buffer region, non-adaptively, and any needed LINK sections",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
NULLIFY(qm_kinds_subsection)
- CALL create_qmmm_qm_kinds(qm_kinds_subsection,error)
- CALL section_add_subsection(subsection,qm_kinds_subsection,error=error)
- CALL section_release(qm_kinds_subsection,error=error)
+ CALL create_qmmm_qm_kinds(qm_kinds_subsection)
+ CALL section_add_subsection(subsection,qm_kinds_subsection)
+ CALL section_release(qm_kinds_subsection)
NULLIFY(link_subsection)
- CALL create_qmmm_link_section(link_subsection,error)
- CALL section_add_subsection(subsection,link_subsection,error=error)
- CALL section_release(link_subsection,error=error)
+ CALL create_qmmm_link_section(link_subsection)
+ CALL section_add_subsection(subsection,link_subsection)
+ CALL section_release(link_subsection)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
![NB] also need a list?
@@ -515,66 +500,61 @@ SUBROUTINE create_qmmm_force_mixing_section(section, error)
CALL section_create(subsection,name="BUFFER_LINKS",&
description="Information about possible links for automatic covalent bond breaking for the buffer QM/MM calculation."//&
"Ignored - need to implement buffer selection by atom and walking of connectivity data.",&
- n_keywords=0, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.TRUE.)
NULLIFY(link_subsection)
- CALL create_qmmm_link_section(link_subsection,error)
- CALL section_add_subsection(subsection,link_subsection,error=error)
- CALL section_release(link_subsection,error=error)
+ CALL create_qmmm_link_section(link_subsection)
+ CALL section_add_subsection(subsection,link_subsection)
+ CALL section_release(link_subsection)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! RESTART_INFO subsection
NULLIFY(subsection)
CALL section_create(subsection,name="RESTART_INFO",&
description="This section provides information about old force-mixing indices and labels, "//&
"for restarts.", &
- n_keywords=2, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="INDICES",&
description="Indices of atoms in previous step QM regions.", &
usage="INDICES 1 2 ...", &
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LABELS",&
description="Labels of atoms in previous step QM regions.", &
usage="LABELS 1 1 ...", &
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
! PRINT subsection, with keys for neighbor list
CALL section_create(subsection,name="print",&
description="Section of possible print options in FORCE_MIXING.",&
- n_keywords=0, n_subsections=2, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=2, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"SUBCELL",&
description="Activates the printing of the subcells used for the"//&
"generation of neighbor lists.", unit_str="angstrom",&
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"NEIGHBOR_LISTS",&
description="Activates the printing of the neighbor lists used"//&
" for the hysteretic region calculations.", &
- print_level=high_print_level,filename="",unit_str="angstrom",&
- error=error)
- CALL section_add_subsection(subsection,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="",unit_str="angstrom")
+ CALL section_add_subsection(subsection,print_key)
+ CALL section_release(print_key)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_force_mixing_section
@@ -582,13 +562,10 @@ END SUBROUTINE create_qmmm_force_mixing_section
! *****************************************************************************
!> \brief Input section to create QM kinds sections
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_qm_kinds(section,error)
+ SUBROUTINE create_qmmm_qm_kinds(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_qm_kinds', &
routineP = moduleN//':'//routineN
@@ -598,37 +575,33 @@ SUBROUTINE create_qmmm_qm_kinds(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="QM_KIND",&
description="Information about the QM kind in the QM/MM scheme",&
- n_keywords=3, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
- description="The QM kind",usage="O",n_var=1,type_of_var=char_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ description="The QM kind",usage="O",n_var=1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_INDEX",&
description="The indexes of the MM atoms that have this kind. This keyword can be"//&
" repeated several times (useful if you have to specify many indexes).",&
usage="MM_INDEX 1 2",&
- n_var=-1,type_of_var=integer_t,repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=integer_t,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_qmmm_qm_kinds
! *****************************************************************************
!> \brief Input section to set QM/MM periodic boundary conditions
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_walls_section(section,error)
+ SUBROUTINE create_qmmm_walls_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_walls_section', &
routineP = moduleN//':'//routineN
@@ -639,23 +612,22 @@ SUBROUTINE create_qmmm_walls_section(section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="WALLS",&
description="Enables Walls for the QM box. This can be used to avoid that QM "//&
" atoms move out of the QM box.",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="WALL_SKIN",&
description="Specify the value of the skin of the Wall in each dimension. "//&
"The wall's effect is felt when atoms fall within the skin of the Wall.",&
usage="WALL_SKIN ",n_var=3,type_of_var=real_t,&
- default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom",error=error),&
- cp_unit_to_cp2k(0.5_dp,"angstrom",error=error),&
- cp_unit_to_cp2k(0.5_dp,"angstrom",error=error) /),&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/ cp_unit_to_cp2k(0.5_dp,"angstrom"),&
+ cp_unit_to_cp2k(0.5_dp,"angstrom"),&
+ cp_unit_to_cp2k(0.5_dp,"angstrom") /),&
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TYPE",&
description="Specifies the type of wall",&
@@ -665,29 +637,26 @@ SUBROUTINE create_qmmm_walls_section(section,error)
enum_desc=s2a("No Wall around QM box", &
"Reflective Wall around QM box",&
"Quadratic Wall around QM box"),&
- default_i_val=do_qmmm_wall_reflective, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_wall_reflective)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="K",&
description="Specify the value of the the force constant for the quadratic wall",&
usage="K ",unit_str='internal_cp2k',&
- type_of_var=real_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_qmmm_walls_section
! ****************************************************************************
!> \brief Input section for QM/MM image charge calculations
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze
! *****************************************************************************
- SUBROUTINE create_qmmm_image_charge_section (section,error)
+ SUBROUTINE create_qmmm_image_charge_section (section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_qmmm_image_charge_section', &
@@ -699,39 +668,38 @@ SUBROUTINE create_qmmm_image_charge_section (section,error)
failure=.FALSE.
NULLIFY(keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="IMAGE_CHARGE",&
description="Inclusion of polarization effects within the image charge "//&
"approach for systems where QM molecules are physisorbed on e.g. metal "//&
"surfaces described by MM. QM box size has to be equal to MM box size.",&
n_keywords=3, n_subsections=0, repeats=.FALSE., &
- citations=(/Golze2013/),&
- error=error)
+ citations=(/Golze2013/))
CALL keyword_create(keyword, name="MM_ATOM_LIST",&
description="List of MM atoms carrying an induced Gaussian charge. "//&
"If this keyword is not given, all MM atoms will carry an image charge.",&
usage="MM_ATOM_LIST 1 2 3 or 1..3 ",n_var=-1,type_of_var=integer_t,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WIDTH",&
description="Specifies the value of the width of the (induced) Gaussian "//&
"charge distribution carried by each MM atom.",&
usage="WIDTH ",n_var=1,type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=3.0_dp,unit_str="angstrom^-2", error=error), &
- unit_str="angstrom^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=3.0_dp,unit_str="angstrom^-2"), &
+ unit_str="angstrom^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXT_POTENTIAL",&
description="External potential applied to the metal electrode ",&
usage="EXT_POTENTIAL ",n_var=1,type_of_var=real_t,&
default_r_val= 0.0_dp,&
- unit_str="volt",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="volt")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DETERM_COEFF",&
description="Specifies how the coefficients are determined.",&
@@ -740,40 +708,36 @@ SUBROUTINE create_qmmm_image_charge_section (section,error)
enum_i_vals=(/ do_qmmm_image_calcmatrix, do_qmmm_image_iter/),&
enum_desc=s2a("Calculates image matrix and solves linear set of equations", &
"Uses an iterative scheme to calculate the coefficients"),&
- default_i_val=do_qmmm_image_calcmatrix, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_image_calcmatrix)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTART_IMAGE_MATRIX",&
description="Restart the image matrix. Useful when "//&
"calculating coefficients iteratively (the image matrix "//&
"is used as preconditioner in that case)",&
usage="RESTART_IMAGE_MATRIX", default_l_val=.FALSE., &
- lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="IMAGE_RESTART_FILE_NAME",&
description="File name where to read the image matrix used "//&
"as preconditioner in the iterative scheme",&
usage="IMAGE_RESTART_FILE_NAME ",&
- type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_qmmm_image_charge_section
! *****************************************************************************
!> \brief Input section to set QM/MM periodic boundary conditions
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_periodic_section(section,error)
+ SUBROUTINE create_qmmm_periodic_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_periodic_section', &
routineP = moduleN//':'//routineN
@@ -785,69 +749,61 @@ SUBROUTINE create_qmmm_periodic_section(section,error)
failure=.FALSE.
NULLIFY(keyword, subsection)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="PERIODIC",&
description="Specify parameters for QM/MM periodic boundary conditions calculations",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Laino2006/),&
- error=error)
+ citations=(/Laino2006/))
CALL keyword_create(keyword, name="GMAX",&
description="Specifies the maximum value of G in the reciprocal space over which perform the Ewald sum.",&
- usage="GMAX ",n_var=1,default_r_val=1.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GMAX ",n_var=1,default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REPLICA",&
description="Specifies the number of replica to take into consideration for the real part of the "//&
"calculation. Default is letting the qmmm module decide how many replica you really need.",&
- usage="REPLICA ",n_var=1,default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="REPLICA ",n_var=1,default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGRIDS",&
description="Specifies the number of grid points used for the Interpolation of the G-space term",&
- usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_multipole_qmmm_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_multipole_qmmm_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_gspace_interp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gspace_interp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_poisson_section(subsection, error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_poisson_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,"check_spline",&
description="Controls the checking of the G-space term Spline Interpolation.",&
- print_level=medium_print_level,filename="GSpace-SplInterp",&
- error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=medium_print_level,filename="GSpace-SplInterp")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_periodic_section
! *****************************************************************************
!> \brief Section to set-up parameters for decoupling using the Bloechl scheme
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \par History
!> Dorothea Golze [04.2014] copied from input_cp2k_poisson.F and
!> enabled switch-on/off
!> \author teo
! *****************************************************************************
- SUBROUTINE create_multipole_qmmm_section(section,error)
+ SUBROUTINE create_multipole_qmmm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_multipole_qmmm_section', &
@@ -859,14 +815,13 @@ SUBROUTINE create_multipole_qmmm_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="MULTIPOLE",&
description="This section is used to set up the decoupling of QM periodic images with "//&
"the use of density derived atomic point charges. Switched on by default even if not "//&
"explicitly given. Can be switched off if e.g. QM and MM box are of the same size.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
@@ -876,56 +831,52 @@ SUBROUTINE create_multipole_qmmm_section(section,error)
enum_i_vals=(/do_multipole_section_on, do_multipole_section_off/),&
enum_desc=s2a("switch on MULTIPOLE section", &
"switch off MULTIPOLE section"), &
- default_i_val=do_multipole_section_on,lone_keyword_i_val=do_multipole_section_on,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_multipole_section_on,lone_keyword_i_val=do_multipole_section_on)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RCUT",&
description="Real space cutoff for the Ewald sum.",&
usage="RCUT {real}", n_var=1, type_of_var=real_t,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EWALD_PRECISION",&
description="Precision achieved in the Ewald sum.",&
usage="EWALD_PRECISION {real}", n_var=1, type_of_var=real_t,&
- unit_str="hartree",default_r_val=1.0E-6_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="hartree",default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ANALYTICAL_GTERM",&
description="Evaluates the Gterm in the Ewald Scheme analytically instead of using Splines.",&
usage="ANALYTICAL_GTERM ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NGRIDS",&
description="Specifies the number of grid points used for the Interpolation of the G-space term",&
- usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NGRIDS ",n_var=3,default_i_vals=(/50,50,50/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_gspace_interp_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gspace_interp_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,"check_spline",&
description="Controls the checking of the G-space term Spline Interpolation.",&
- print_level=medium_print_level,filename="GSpace-SplInterp",&
- error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=medium_print_level,filename="GSpace-SplInterp")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL cp_print_key_section_create(subsection,"program_run_info",&
description="Controls the printing of basic information during the run", &
- print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ print_level=low_print_level,add_last=add_last_numeric,filename="__STD_OUT__")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_multipole_qmmm_section
@@ -934,13 +885,10 @@ END SUBROUTINE create_multipole_qmmm_section
!> \brief creates the qm/mm forcefield section to override to the FF specification
!> given in the FIST input
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_forcefield_section(section,error)
+ SUBROUTINE create_qmmm_forcefield_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_qmmm_forcefield_section', &
@@ -953,27 +901,25 @@ SUBROUTINE create_qmmm_forcefield_section(section,error)
failure=.FALSE.
NULLIFY(subsection,keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="FORCEFIELD",&
description="Specify information on the QM/MM forcefield",&
- n_keywords=0, n_subsections=2, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=2, repeats=.TRUE.)
CALL keyword_create(keyword, name="MULTIPLE_POTENTIAL",&
description="Enables the possibility to define NONBONDED and NONBONDED14 as a"//&
" sum of different kinds of potential. Useful for piecewise defined potentials.",&
- usage="MULTIPLE_POTENTIAL T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MULTIPLE_POTENTIAL T",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_qmmm_ff_nb_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_qmmm_ff_nb_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_NONBONDED14_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_NONBONDED14_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_forcefield_section
@@ -981,13 +927,10 @@ END SUBROUTINE create_qmmm_forcefield_section
!> \brief creates the qm/mm forcefield section to override to the FF specification
!> given in the FIST input - NONBONDED PART
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_ff_nb_section(section,error)
+ SUBROUTINE create_qmmm_ff_nb_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_ff_nb_section', &
routineP = moduleN//':'//routineN
@@ -998,40 +941,36 @@ SUBROUTINE create_qmmm_ff_nb_section(section,error)
failure=.FALSE.
NULLIFY(subsection )
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="NONBONDED",&
description="Specify information on the QM/MM non-bonded forcefield",&
- n_keywords=0, n_subsections=2, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=2, repeats=.TRUE.)
- CALL create_LJ_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_LJ_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Williams_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Williams_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_Goodwin_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_Goodwin_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_GENPOT_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_GENPOT_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_ff_nb_section
! *****************************************************************************
!> \brief creates the qm/mm link section
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_link_section(section,error)
+ SUBROUTINE create_qmmm_link_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_link_section', &
routineP = moduleN//':'//routineN
@@ -1043,48 +982,45 @@ SUBROUTINE create_qmmm_link_section(section,error)
failure=.FALSE.
NULLIFY(keyword, subsection )
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="LINK",&
description="Specify information on the QM/MM link treatment",&
- n_keywords=7, n_subsections=2, repeats=.TRUE., &
- error=error)
+ n_keywords=7, n_subsections=2, repeats=.TRUE.)
CALL keyword_create(keyword, name="QM_INDEX",&
variants=(/ "QM" /),&
description="Specifies the index of the QM atom involved in the QM/MM link",&
- usage="QM_INDEX integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="QM_INDEX integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QM_KIND",&
description="Specifies the element of the QM capping atom involved in the QM/MM link",&
usage="QM_KIND char",n_var=1,type_of_var=char_t,&
- default_c_val="H",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="H")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_INDEX",&
variants=(/ "MM" /),&
description="Specifies the index of the MM atom involved in the QM/MM link, Default hydrogen.",&
- usage="MM_INDEX integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MM_INDEX integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADIUS",&
description="Overwrite the specification of the radius only for the MM atom involved in the link."//&
"Default is to use the same radius as for the specified type.",&
- usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORR_RADIUS",&
description="Overwrite the specification of the correction radius only for the MM atom involved in the link."//&
"Default is to use the same correction radius as for the specified type.",&
- usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LINK_TYPE",&
variants=(/ "LINK ","TYPE ","LTYPE"/),&
@@ -1095,9 +1031,9 @@ SUBROUTINE create_qmmm_link_section(section,error)
enum_desc=s2a("Use Generalized Hybrid Orbital method",&
"Use Integrated Molecular Orbital Molecular Mechanics method",&
"Use a monovalent pseudo-potential"),&
- default_i_val=do_qmmm_link_imomm, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_qmmm_link_imomm)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA_IMOMM",&
variants=s2a("ALPHA"),&
@@ -1106,9 +1042,9 @@ SUBROUTINE create_qmmm_link_section(section,error)
"A good guess can be derived from the bond distances of the forcefield: "//&
"alpha = r_eq(QM-MM) / r_eq(QM-H).",&
usage="ALPHA_IMOMM real",n_var=1,type_of_var=real_t,&
- default_r_val=ALPHA_IMOMM_DEFAULT,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=ALPHA_IMOMM_DEFAULT)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QMMM_SCALE_FACTOR",&
variants=(/ "QMMM_CHARGE_SCALE ",&
@@ -1119,9 +1055,9 @@ SUBROUTINE create_qmmm_link_section(section,error)
" the classical part of the code. "//&
"Default 1.0 i.e. no charge rescaling of the MM atom of the QM/MM link bond.",&
usage="SCALE_FACTOR real",n_var=1,type_of_var=real_t,&
- default_r_val=CHARGE_SCALE_FACTOR,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=CHARGE_SCALE_FACTOR)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FIST_SCALE_FACTOR",&
variants=(/ "FIST_CHARGE_SCALE ",&
@@ -1132,119 +1068,109 @@ SUBROUTINE create_qmmm_link_section(section,error)
" for the generation of the QM/MM potential. "//&
"Default 1.0 i.e. no charge rescaling of the MM atom of the QM/MM link bond.",&
usage="SCALE_FACTOR real",n_var=1,type_of_var=real_t,&
- default_r_val=CHARGE_SCALE_FACTOR,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=CHARGE_SCALE_FACTOR)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="MOVE_MM_CHARGE",&
description="Specify information to move a classical charge before the"//&
" QM/MM energies and forces evaluation",&
- n_keywords=4, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=4, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="ATOM_INDEX_1",&
variants=(/ "MM1" /),&
description="Specifies the index of the MM atom involved in the QM/MM link to be moved",&
- usage="ATOM_INDEX_1 integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ATOM_INDEX_1 integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOM_INDEX_2",&
variants=(/ "MM2" /),&
description="Specifies the index of the second atom defining the direction along which "//&
" the atom will be moved",&
- usage="ATOM_INDEX_2 integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ATOM_INDEX_2 integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA",&
description="Specifies the scaling factor that defines the movement along the defined direction",&
- usage="ALPHA real",n_var=1,type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ALPHA real",n_var=1,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADIUS",&
description="Specifies the radius used for the QM/MM electrostatic coupling after movement",&
- usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom", default_r_val=0.0_dp, &
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom", default_r_val=0.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORR_RADIUS",&
description="Specifies the correction radius used for the QM/MM electrostatic coupling after movement",&
- usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom", default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIUS real",n_var=1,type_of_var=real_t,unit_str="angstrom", default_r_val=0.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="ADD_MM_CHARGE",&
description="Specify information to add a classical charge before the"//&
" QM/MM energies and forces evaluation",&
- n_keywords=5, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="ATOM_INDEX_1",&
variants=(/ "MM1" /),&
description="Specifies the index of the first atom defining the direction along which"//&
" the atom will be added",&
- usage="ATOM_INDEX_1 integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ATOM_INDEX_1 integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOM_INDEX_2",&
variants=(/ "MM2" /),&
description="Specifies the index of the second atom defining the direction along which "//&
" the atom will be added",&
- usage="ATOM_INDEX_2 integer",n_var=1,type_of_var=integer_t,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ATOM_INDEX_2 integer",n_var=1,type_of_var=integer_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA",&
description="Specifies the scaling factor that defines the movement along the defined direction",&
- usage="ALPHA real",n_var=1,type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ALPHA real",n_var=1,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADIUS",&
description="Specifies the radius used for the QM/MM electrostatic coupling for the added source",&
usage="RADIUS real",n_var=1,unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom",error=error),error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom"))
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORR_RADIUS",&
description="Specifies the correction radius used for the QM/MM electrostatic coupling for the added source",&
usage="RADIUS real",n_var=1,unit_str="angstrom",&
- default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom",error=error),error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(RADIUS_QMMM_DEFAULT,"angstrom"))
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE",&
description="Specifies the charge for the added source of QM/MM potential",&
- usage="CHARGE real",default_r_val=0.0_dp,n_var=1,type_of_var=real_t,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CHARGE real",default_r_val=0.0_dp,n_var=1,type_of_var=real_t)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_qmmm_link_section
! *****************************************************************************
!> \brief creates the interpolation section
!> \param section ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author tlaino
! *****************************************************************************
- SUBROUTINE create_qmmm_interp_section(section,error)
+ SUBROUTINE create_qmmm_interp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_qmmm_interp_section', &
routineP = moduleN//':'//routineN
@@ -1255,11 +1181,10 @@ SUBROUTINE create_qmmm_interp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="interpolator",&
description="kind of interpolation used between the multigrids",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, print_key)
@@ -1268,18 +1193,17 @@ SUBROUTINE create_qmmm_interp_section(section,error)
usage="kind spline3",&
default_i_val=spline3_nopbc_interp,&
enum_c_vals=s2a("spline3_nopbc"),&
- enum_i_vals=(/spline3_nopbc_interp/),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/spline3_nopbc_interp/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="safe_computation",&
description="if a non unrolled calculation is to be performed in parallel",&
usage="safe_computation OFF",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="aint_precond",&
description="the approximate inverse to use to get the starting point"//&
@@ -1289,10 +1213,9 @@ SUBROUTINE create_qmmm_interp_section(section,error)
enum_c_vals=s2a( "copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="precond",&
description="The preconditioner used"//&
@@ -1302,29 +1225,28 @@ SUBROUTINE create_qmmm_interp_section(section,error)
enum_c_vals=s2a("copy","spl3_nopbc_aint1","spl3_nopbc_precond1",&
"spl3_nopbc_aint2","spl3_nopbc_precond2","spl3_nopbc_precond3"),&
enum_i_vals=(/no_precond,precond_spl3_aint, precond_spl3_1,&
- precond_spl3_aint2, precond_spl3_2, precond_spl3_3/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ precond_spl3_aint2, precond_spl3_2, precond_spl3_3/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_x",&
description="accuracy on the solution for spline3 the interpolators",&
- usage="eps_x 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_x 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="eps_r",&
description="accuracy on the residual for spline3 the interpolators",&
- usage="eps_r 1.e-15", default_r_val=1.e-10_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="eps_r 1.e-15", default_r_val=1.e-10_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="max_iter",&
variants=(/'maxiter'/),&
description="the maximum number of iterations",&
- usage="max_iter 200", default_i_val=100, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="max_iter 200", default_i_val=100)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"conv_info",&
@@ -1332,29 +1254,25 @@ SUBROUTINE create_qmmm_interp_section(section,error)
" of the spline methods should be printed", &
print_level=medium_print_level,each_iter_names=s2a("SPLINE_FIND_COEFFS"),&
each_iter_values=(/10/),filename="__STD_OUT__",&
- add_last=add_last_numeric,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ add_last=add_last_numeric)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"spl_coeffs",&
description="outputs a cube with the coefficents calculated for "//&
"the spline interpolation", &
- print_level=debug_print_level,&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_qmmm_interp_section
! *****************************************************************************
!> \brief Create the print qmmm section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_print_qmmm_section(section,error)
+ SUBROUTINE create_print_qmmm_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_qmmm_section', &
routineP = moduleN//':'//routineN
@@ -1365,12 +1283,11 @@ SUBROUTINE create_print_qmmm_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword, print_key)
CALL section_create(section,name="print",&
description="Section of possible print options specific of the QMMM code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
@@ -1378,121 +1295,110 @@ SUBROUTINE create_print_qmmm_section(section,error)
description="Controls the printing of the DIPOLE in a QM/MM calculations."//&
" It requires that the DIPOLE calculations is "//&
" requested both for the QS and for the MM part.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PGF",&
description="Controls the printing of the gaussian expansion basis set of the"//&
" electrostatic potential", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"POTENTIAL",&
description="Controls the printing of the QMMM potential",&
print_level=high_print_level,filename="MM_ELPOT_QMMM",&
- common_iter_levels=1,error=error)
+ common_iter_levels=1)
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"MM_POTENTIAL",&
description="Controls the printing of the MM unidimensional potential on file",&
print_level=high_print_level,filename="MM_ELPOT",&
- common_iter_levels=1,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ common_iter_levels=1)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"QMMM_MATRIX",&
description="Controls the printing of the QMMM 1 electron Hamiltonian Matrix"//&
" for methods like semiempirical and DFTB",&
print_level=high_print_level,filename="__STD_OUT__",&
- common_iter_levels=1,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ common_iter_levels=1)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_BANNER",&
description="Controls the printing of the banner of the MM program",&
- print_level=silent_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=silent_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of information regarding the run.",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"PERIODIC_INFO",&
description="Controls the printing of information regarding the periodic boundary condition.",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"GRID_INFORMATION",&
description="Controls the printing of information regarding the PW grid structures"//&
" for PERIODIC QM/MM calculations.",&
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"derivatives",&
description="Print all derivatives after QM/MM calculation", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"qmmm_charges",&
description="Print all charges generating the QM/MM potential", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"qmmm_link_info",&
description="Print all information on QM/MM links", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"qs_derivatives",&
description="Print QM derivatives after QS calculation", &
- print_level=medium_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"image_charge_info",&
description="Prints image charge coefficients and detailed energy info", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"image_charge_restart",&
description="Controls the printing of the restart file for "// &
"the image matrix when using the iterative scheme",&
print_level=low_print_level,add_last=add_last_numeric,filename="RESTART",&
- common_iter_levels=3, error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ common_iter_levels=3)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_qmmm_section
diff --git a/src/input_cp2k_read.F b/src/input_cp2k_read.F
index 5b5183765e..81c1fb407d 100644
--- a/src/input_cp2k_read.F
+++ b/src/input_cp2k_read.F
@@ -44,17 +44,14 @@ MODULE input_cp2k_read
!> \param file_path path where the input should be read
!> \param initial_variables ...
!> \param para_env ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \retval res ...
!> \author fawzi
! *****************************************************************************
- FUNCTION read_input(input_declaration, file_path,initial_variables, para_env,error) RESULT(res)
+ FUNCTION read_input(input_declaration, file_path,initial_variables, para_env) RESULT(res)
TYPE(section_type), POINTER :: input_declaration
CHARACTER(len=*), INTENT(in) :: file_path
CHARACTER(len=*), DIMENSION(:, :) :: initial_variables
TYPE(cp_para_env_type), POINTER :: para_env
- TYPE(cp_error_type), INTENT(inout) :: error
TYPE(section_vals_type), POINTER :: res
CHARACTER(len=*), PARAMETER :: routineN = 'read_input', &
@@ -69,14 +66,14 @@ FUNCTION read_input(input_declaration, file_path,initial_variables, para_env,err
failure=.FALSE.
NULLIFY(res)
NULLIFY(cpparser, default_units)
- CALL section_vals_create(res,input_declaration, error=error)
+ CALL section_vals_create(res,input_declaration)
CALL parser_create(cpparser,initial_variables=initial_variables,file_name=file_path, &
- para_env=para_env, error=error)
- CALL cp_unit_set_create(default_units, "OUTPUT",error=error)
+ para_env=para_env)
+ CALL cp_unit_set_create(default_units, "OUTPUT")
CALL section_vals_parse(res,cpparser,root_section=.FALSE.,&
- default_units=default_units,error=error)
- CALL cp_unit_set_release(default_units,error=error)
- CALL parser_release(cpparser,error=error)
+ default_units=default_units)
+ CALL cp_unit_set_release(default_units)
+ CALL parser_release(cpparser)
CALL timestop(handle)
END FUNCTION read_input
diff --git a/src/input_cp2k_resp.F b/src/input_cp2k_resp.F
index 60094b5216..76c815f19d 100644
--- a/src/input_cp2k_resp.F
+++ b/src/input_cp2k_resp.F
@@ -51,13 +51,10 @@ MODULE input_cp2k_resp
! *****************************************************************************
!> \brief Creates the RESP section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele
! *****************************************************************************
- SUBROUTINE create_resp_section(section,error)
+ SUBROUTINE create_resp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_resp_section', &
routineP = moduleN//':'//routineN
@@ -68,7 +65,7 @@ SUBROUTINE create_resp_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RESP",&
description="Requests a RESP fit of charges. When using a periodic "//&
"Poisson solver and a periodic cell, the periodic RESP routines are "//&
@@ -76,8 +73,7 @@ SUBROUTINE create_resp_section(section,error)
"system (i.e. isolated Poisson solver and big, nonperiodic cells), "//&
"the nonperiodic RESP routines are automatically used. All restraints "//&
"are harmonic!",&
- n_keywords=2, n_subsections=2, repeats=.FALSE., citations=(/Golze2015/),&
- error=error)
+ n_keywords=2, n_subsections=2, repeats=.FALSE., citations=(/Golze2015/))
NULLIFY(keyword, subsection)
@@ -85,75 +81,72 @@ SUBROUTINE create_resp_section(section,error)
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide "//&
"3 numbers (for X,Y,Z) or 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INTEGER_TOTAL_CHARGE",&
description="Forces the total charge to be integer",&
usage="INTEGER_TOTAL_CHARGE TRUE",&
- default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTRAIN_HEAVIES_TO_ZERO",&
description="Restrain non-hydrogen atoms to zero.",&
usage="RESTRAIN_HEAVIES_TO_ZERO FALSE",&
- default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RESTRAIN_HEAVIES_STRENGTH",&
description="If defined, enforce the restraint of non-hydrogen "//&
"atoms to zero. Its value is the strength of the restraint on "//&
"the heavy atoms.",&
usage="RESTRAIN_HEAVIES_STRENGTH 0.0001 ",&
- default_r_val=1.0E-6_dp ,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="WIDTH",&
description="Specifies the value of the width of the Gaussian "//&
"charge distribution carried by each atom. Needs only "//&
"to be specified when using a periodic Poisson solver.",&
usage="WIDTH ",n_var=1,type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=11.249_dp,unit_str="angstrom^-2",error=error), &
- unit_str="angstrom^-2",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=11.249_dp,unit_str="angstrom^-2"), &
+ unit_str="angstrom^-2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_constraint_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_constraint_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_restraint_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_restraint_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_sphere_sampling_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_sphere_sampling_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_slab_sampling_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_slab_sampling_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_print_resp_section(subsection, error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_resp_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_resp_section
! *****************************************************************************
!> \brief specifies constraints to be satisfied in a resp fit
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele
! *****************************************************************************
- SUBROUTINE create_constraint_section(section,error)
+ SUBROUTINE create_constraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_constraint_section', &
routineP = moduleN//':'//routineN
@@ -163,22 +156,21 @@ SUBROUTINE create_constraint_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="CONSTRAINT",&
description="specifies a linear constraint on the fitted charges."//&
"This can be used to give equal values to equivalent atoms." //&
"sum over atom_list c_i * q_i = t",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="the target value for the constraint",&
usage="TARGET 0.0",&
- n_var=1,default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EQUAL_CHARGES",&
description="All atoms in ATOM_LIST are constrained to have the "//&
@@ -186,25 +178,24 @@ SUBROUTINE create_constraint_section(section,error)
"not need to be set and will be ignored. Instead of using this "//&
"keyword, the constraint section could be repeated.",&
usage="EQUAL_CHARGES",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOM_LIST",&
description="Defines the list of atoms involved in this constraint",&
usage="ATOM_LIST 3 4",&
- type_of_var=integer_t, n_var=-1,repeats=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t, n_var=-1,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOM_COEF",&
description="Defines the coefficient of the atom in this "//&
"linear constraint",&
usage="ATOM_COEF 1.0 -1.0",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_constraint_section
@@ -212,13 +203,10 @@ END SUBROUTINE create_constraint_section
! *****************************************************************************
!> \brief specifies restraints to be added to a resp fit
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Joost VandeVondele
! *****************************************************************************
- SUBROUTINE create_restraint_section(section,error)
+ SUBROUTINE create_restraint_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_restraint_section', &
routineP = moduleN//':'//routineN
@@ -228,46 +216,44 @@ SUBROUTINE create_restraint_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RESTRAINT",&
description="specifies a restraint on the fitted charges."//&
"This can be used to restrain values to zero." //&
"s*(sum over atom_list q_i - t)**2",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="TARGET",&
description="the target value for the restraint",&
usage="TARGET 0.0",&
- n_var=1,default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STRENGTH",&
description="the target value for the constraint",&
usage="STRENGTH 0.001",&
- n_var=1,default_r_val=0.001_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=0.001_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOM_LIST",&
description="Defines the list of atoms involved in this restraint",&
usage="ATOM_LIST 3 4",&
- type_of_var=integer_t, n_var=-1, repeats=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t, n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ATOM_COEF",&
description="Defines the coefficient of the atom in this "//&
"linear restraint. If given, the restraint will be: "//&
"s*(sum over atom_list c_i * q_i - t)**2 ",&
usage="ATOM_COEF 1.0 -1.0",&
- type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_restraint_section
@@ -276,13 +262,10 @@ END SUBROUTINE create_restraint_section
!> \brief specifies the parameter for sampling the resp fitting points for
!> molecular structures; sampling in spheres around the atoms
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze
! *****************************************************************************
- SUBROUTINE create_sphere_sampling_section(section,error)
+ SUBROUTINE create_sphere_sampling_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_sphere_sampling_section', &
@@ -293,86 +276,86 @@ SUBROUTINE create_sphere_sampling_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SPHERE_SAMPLING",&
description="Specifies the parameter for sampling the RESP fitting points "//&
"for molecular structures, i.e. systems that do not involve " //&
"surfaces. Fitting points are sampled in spheres around the "//&
"atom. All grid points in the shell defined by rmin and rmax "//&
"are accepted for fitting.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="X_LOW",&
description="Specifies the lower boundary of the box along X used to sample the potential.",&
- usage="X_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="X_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="X_HI",&
description="Specifies the upper boundary of the box along X used to sample the potential.",&
- usage="X_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="X_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Y_LOW",&
description="Specifies the lower boundary of the box along Y used to sample the potential.",&
- usage="Y_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="Y_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Y_HI",&
description="Specifies the upper boundary of the box along Y used to sample the potential.",&
- usage="Y_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="Y_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Z_LOW",&
description="Specifies the lower boundary of the box along Z used to sample the potential.",&
- usage="Z_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="Z_LOW -15.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Z_HI",&
description="Specifies the upper boundary of the box along Z used to sample the potential.",&
- usage="Z_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="Z_HI 5.", type_of_var=real_t, n_var=1, unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX",&
description="Specifies the maximum distance a fit point is away from an atom. "//&
"Valid for all atomic kinds for which no RMAX_KIND are specified.",&
usage="RMAX 2.5",&
- default_r_val=cp_unit_to_cp2k(value=2.5_dp, unit_str="angstrom", error=error),&
- unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=2.5_dp, unit_str="angstrom"),&
+ unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN",&
description="Specifies the minimum distance a fit point is away from an atom. "//&
"Valid for all atomic kinds for which no RMIN_KIND are specified.",&
usage="RMIN 2.1",&
- default_r_val=cp_unit_to_cp2k(value=2.1_dp, unit_str="angstrom", error=error),&
- unit_str='angstrom', error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=2.1_dp, unit_str="angstrom"),&
+ unit_str='angstrom')
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMAX_KIND",&
description="Specifies the maximum distance a fit point is away from an atom "//&
"of a given kind",&
usage="RMAX 2.5 Br", repeats=.TRUE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RMIN_KIND",&
description="Specifies the minimum distance a fit point is away from an atom "//&
"of a given kind",&
usage="RMIN 2.1 Br", repeats=.TRUE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_sphere_sampling_section
@@ -381,13 +364,10 @@ END SUBROUTINE create_sphere_sampling_section
!> \brief specifies the parameter for sampling the resp fitting points for
!> slab-like periodic systems, i.e. systems that involve surfaces
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze
! *****************************************************************************
- SUBROUTINE create_slab_sampling_section(section,error)
+ SUBROUTINE create_slab_sampling_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_slab_sampling_section', &
routineP = moduleN//':'//routineN
@@ -397,15 +377,14 @@ SUBROUTINE create_slab_sampling_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="SLAB_SAMPLING",&
description="Specifies the parameter for sampling the RESP fitting "//&
"points for slab-like periodic systems, i.e. systems that "//&
"involve surfaces. This section can only be used with periodic "//&
"Poisson solver and cell. To see, which grid points were "//&
"used, switch on COORD_FIT_POINTS in the PRINT section.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
@@ -414,20 +393,18 @@ SUBROUTINE create_slab_sampling_section(section,error)
"the region for the RESP fitting. The list should "//&
"contain indexes of atoms of the first surface layer." ,&
usage="ATOM_LIST 1 2 3 or 1..3",&
- type_of_var=integer_t, n_var=-1,repeats=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t, n_var=-1,repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RANGE",&
description="Range where the fitting points are sampled. A range of "//&
"3 to 5 Angstroms means that the fitting points are sampled in the region "//&
"of 3 to 5 Angstroms above the surface which is defined by atom indexes given "//&
"in ATOM_LIST.",&
- usage="RANGE ",unit_str="angstrom",n_var=2,type_of_var=real_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RANGE ",unit_str="angstrom",n_var=2,type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LENGTH",&
description="Length of the sampling box, i.e. a box of this length and "//&
@@ -437,9 +414,9 @@ SUBROUTINE create_slab_sampling_section(section,error)
"on the safe side). Allows for a refined sampling of grid points in case of "//&
"corrugated surfaces.",&
usage="LENGTH ",unit_str="angstrom",n_var=1,type_of_var=real_t,&
- default_r_val=cp_unit_to_cp2k(value=3.0_dp,unit_str="angstrom", error=error),error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(value=3.0_dp,unit_str="angstrom"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SURF_DIRECTION",&
description="Specifies what above the surface means. Defines the direction.",&
@@ -453,9 +430,9 @@ SUBROUTINE create_slab_sampling_section(section,error)
"surface layers are piled up in -x-direction",&
"surface layers are piled up in -y-direction",&
"surface layers are piled up in -z-direction"),&
- default_i_val=do_resp_z_dir, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_resp_z_dir)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_slab_sampling_section
@@ -463,13 +440,10 @@ END SUBROUTINE create_slab_sampling_section
! *****************************************************************************
!> \brief create the resp print section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Dorothea Golze
! *****************************************************************************
- SUBROUTINE create_print_resp_section(section,error)
+ SUBROUTINE create_print_resp_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_resp_section', &
routineP = moduleN//':'//routineN
@@ -479,19 +453,17 @@ SUBROUTINE create_print_resp_section(section,error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(print_key, keyword)
CALL section_create(section,name="print",&
description="Section of possible print options specific for the RESP code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"PROGRAM_RUN_INFO",&
description="Controls the printing of information regarding the run.",&
- print_level=low_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=low_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"COORD_FIT_POINTS",&
description="Controls the printing of the coordinates of the "// &
@@ -499,18 +471,18 @@ SUBROUTINE create_print_resp_section(section,error)
"is intended to be only used for testing (you can get large files).",&
print_level=high_print_level,add_last=add_last_numeric,&
filename="RESP_FIT_POINTS",&
- common_iter_levels=3, error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ common_iter_levels=3)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"RESP_CHARGES_TO_FILE",&
description="Controls the printing of the RESP charges "// &
"to a file.",&
print_level=high_print_level,add_last=add_last_numeric,&
filename="RESP_CHARGES",&
- common_iter_levels=3, error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ common_iter_levels=3)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"V_RESP_CUBE",&
description="Controls the printing of the potential generated "//&
@@ -518,21 +490,21 @@ SUBROUTINE create_print_resp_section(section,error)
"root-mean-square (RRMS) and root-mean-square (RMS) errors.",&
print_level=high_print_level,add_last=add_last_numeric,&
filename="RESP_POTENTIAL",&
- common_iter_levels=3, error=error)
+ common_iter_levels=3)
CALL keyword_create(keyword, name="stride",&
description="The stride (X,Y,Z) used to write the cube file "//&
"(larger values result in smaller cube files). You can provide 3 numbers (for X,Y,Z) or"//&
" 1 number valid for all components.",&
- usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="STRIDE 2 2 2",n_var=-1,default_i_vals=(/2,2,2/), type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="APPEND",&
description="append the cube files when they already exist",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_resp_section
END MODULE input_cp2k_resp
diff --git a/src/input_cp2k_restarts_util.F b/src/input_cp2k_restarts_util.F
index 07bda2d824..24959e24a5 100644
--- a/src/input_cp2k_restarts_util.F
+++ b/src/input_cp2k_restarts_util.F
@@ -36,13 +36,11 @@ MODULE input_cp2k_restarts_util
!> \param particles ...
!> \param velocity ...
!> \param conv_factor ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \par History
!> 02.2006 created [teo]
!> \author Teodoro Laino
! *****************************************************************************
- SUBROUTINE section_velocity_val_set(velocity_section, particles, velocity, conv_factor, error)
+ SUBROUTINE section_velocity_val_set(velocity_section, particles, velocity, conv_factor)
TYPE(section_vals_type), POINTER :: velocity_section
TYPE(particle_list_type), OPTIONAL, &
@@ -50,8 +48,6 @@ SUBROUTINE section_velocity_val_set(velocity_section, particles, velocity, conv_
REAL(KIND=dp), DIMENSION(:, :), &
OPTIONAL, POINTER :: velocity
REAL(KIND=dp) :: conv_factor
- TYPE(cp_error_type), INTENT(inout), &
- OPTIONAL :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'section_velocity_val_set', &
routineP = moduleN//':'//routineN
@@ -67,37 +63,37 @@ SUBROUTINE section_velocity_val_set(velocity_section, particles, velocity, conv_
CALL timeset(routineN,handle)
failure=.FALSE.
NULLIFY(my_val, old_val, section, vals)
- CPPrecondition(ASSOCIATED(velocity_section),cp_failure_level,routineP,error,failure)
- CPPrecondition(velocity_section%ref_count>0,cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(velocity_section),cp_failure_level,routineP,failure)
+ CPPrecondition(velocity_section%ref_count>0,cp_failure_level,routineP,failure)
section => velocity_section%section
- ik=section_get_keyword_index(section,"_DEFAULT_KEYWORD_",error=error)
+ ik=section_get_keyword_index(section,"_DEFAULT_KEYWORD_")
CALL cp_assert(ik/=-2,cp_failure_level,cp_assertion_failed,routineP,&
"section "//TRIM(section%name)//" does not contain keyword "//&
- "_DEFAULT_KEYWORD_",error,failure)
+ "_DEFAULT_KEYWORD_",failure)
! At least one of the two arguments must be present..
check = PRESENT(particles).NEQV.PRESENT(velocity)
- CPPostcondition(check,cp_failure_level,routineP,error,failure)
+ CPPostcondition(check,cp_failure_level,routineP,failure)
IF(PRESENT(particles)) nloop = particles%n_els
IF(PRESENT(velocity)) nloop = SIZE(velocity,2)
DO
IF (SIZE(velocity_section%values,2)==1) EXIT
- CALL section_vals_add_values(velocity_section,error=error)
+ CALL section_vals_add_values(velocity_section)
END DO
vals => velocity_section%values(ik,1)%list
Nlist = 0
IF (ASSOCIATED(vals)) THEN
- Nlist = cp_sll_val_get_length(vals,error)
+ Nlist = cp_sll_val_get_length(vals)
END IF
DO irk=1,nloop
ALLOCATE(vel(3),stat=stat)
- CPPostcondition(stat==0,cp_failure_level,routineP,error,failure)
+ CPPostcondition(stat==0,cp_failure_level,routineP,failure)
! Always stored in A.U.
IF(PRESENT(particles)) vel = particles%els(irk)%v(1:3)*conv_factor
IF(PRESENT(velocity)) vel = velocity(1:3,irk)*conv_factor
- CALL val_create(my_val,r_vals_ptr=vel,error=error)
+ CALL val_create(my_val,r_vals_ptr=vel)
IF (Nlist /= 0) THEN
IF (irk==1) THEN
@@ -106,16 +102,16 @@ SUBROUTINE section_velocity_val_set(velocity_section, particles, velocity, conv_
new_pos => new_pos%rest
END IF
old_val => new_pos%first_el
- CALL val_release(old_val,error=error)
+ CALL val_release(old_val)
new_pos%first_el => my_val
ELSE
IF (irk==1) THEN
NULLIFY(new_pos)
- CALL cp_sll_val_create(new_pos,first_el=my_val,error=error)
+ CALL cp_sll_val_create(new_pos,first_el=my_val)
vals => new_pos
ELSE
NULLIFY(new_pos%rest)
- CALL cp_sll_val_create(new_pos%rest,first_el=my_val,error=error)
+ CALL cp_sll_val_create(new_pos%rest,first_el=my_val)
new_pos => new_pos%rest
END IF
END IF
diff --git a/src/input_cp2k_rsgrid.F b/src/input_cp2k_rsgrid.F
index 4685f9f5be..c0f4205dcb 100644
--- a/src/input_cp2k_rsgrid.F
+++ b/src/input_cp2k_rsgrid.F
@@ -36,12 +36,10 @@ MODULE input_cp2k_rsgrid
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
!> \author Joost
! *****************************************************************************
- SUBROUTINE create_rsgrid_section(section, error)
+ SUBROUTINE create_rsgrid_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_rsgrid_section', &
routineP = moduleN//':'//routineN
@@ -51,10 +49,10 @@ SUBROUTINE create_rsgrid_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RS_GRID",&
description="Set options that influence how the realspace grids are being distributed in parallel runs.",&
- n_keywords=5, n_subsections=0, repeats=.TRUE., error=error)
+ n_keywords=5, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="DISTRIBUTION_TYPE",&
@@ -65,9 +63,9 @@ SUBROUTINE create_rsgrid_section(section, error)
enum_desc=s2a("Use heuristic rules to decide between distributed and replicated", &
"Force a distributed setup if possible",&
"Force a replicated setup"),&
- default_i_val=rsgrid_automatic, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=rsgrid_automatic)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DISTRIBUTION_LAYOUT",&
description="Specifies the number of slices in the x, y and z directions."//&
@@ -76,18 +74,17 @@ SUBROUTINE create_rsgrid_section(section, error)
"Also see LOCK_DISTRIBUTION.",&
usage="DISTRIBUTION_LAYOUT",&
repeats=.FALSE.,n_var=3,&
- default_i_vals=(/-1,-1,-1/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_vals=(/-1,-1,-1/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_DISTRIBUTED_LEVEL",&
description="If the multigrid-level of a grid is larger than the parameter,"//&
" it will not be distributed in the automatic scheme.",&
usage="MAX_DISTRIBUTED_LEVEL 1",&
- default_i_val=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LOCK_DISTRIBUTION",&
description="Expert use only, only basic QS deals correctly with a non-default value."//&
@@ -95,24 +92,24 @@ SUBROUTINE create_rsgrid_section(section, error)
"the next finer multigrid (provided it is distributed)."//&
"If unlocked, all grids can be distributed freely.",&
usage="LOCK_DISTRIBUTION TRUE",&
- default_l_val=.TRUE., error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MEMORY_FACTOR",&
description="A grid will only be distributed if the memory usage for that grid (including halo) "//&
"is smaller than a replicated grid by this parameter.",&
usage="MEMORY_FACTOR 4.0",&
- default_r_val=2.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=2.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HALO_REDUCTION_FACTOR",&
description="Can be used to reduce the halo of the distributed grid (experimental features).",&
usage="HALO_REDUCTION_FACTOR 0.5",&
- default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_rsgrid_section
END MODULE input_cp2k_rsgrid
diff --git a/src/input_cp2k_subsys.F b/src/input_cp2k_subsys.F
index 36bfb448bc..17e77c748e 100644
--- a/src/input_cp2k_subsys.F
+++ b/src/input_cp2k_subsys.F
@@ -74,15 +74,12 @@ MODULE input_cp2k_subsys
!> \param section ...
!> \param periodic ...
!> \param label ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
+ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label)
TYPE(section_type), POINTER :: section
INTEGER, INTENT(IN), OPTIONAL :: periodic
CHARACTER(LEN=*), OPTIONAL :: label
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_cell_section', &
routineP = moduleN//':'//routineN
@@ -99,36 +96,35 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
my_label = "CELL"
IF (PRESENT(periodic)) my_periodic = periodic
IF (PRESENT(label)) my_label = label
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,TRIM(my_label),&
description="Input parameters needed to set up the "//TRIM(my_label)//".",&
- n_keywords=6, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=6, n_subsections=1, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="A",&
description="Specify the Cartesian components for the cell vector A. "//&
"This defines the first column of the h matrix.",&
usage="A 10.000 0.000 0.000",unit_str="angstrom",&
- n_var=3,type_of_var=real_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="B",&
description="Specify the Cartesian components for the cell vector B. "//&
"This defines the second column of the h matrix.",&
usage="B 0.000 10.000 0.000", unit_str="angstrom",&
- n_var=3,type_of_var=real_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="C",&
description="Specify the Cartesian components for the cell vector C. "//&
"This defines the third column of the h matrix.",&
usage="C 0.000 0.000 10.000", unit_str="angstrom",&
- n_var=3,type_of_var=real_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ABC",&
description="Specify the lengths of the cell vectors A, B, and C, which"//&
@@ -137,9 +133,9 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
"ALPHA, BETA, GAMMA via ALPHA_BETA_GAMMA keyword or alternatively use the keywords "//&
"A, B, and C. The convention is that A lies along the X-axis, B is in the XY plane.",&
usage="ABC 10.000 10.000 10.000", unit_str="angstrom",&
- n_var=3,type_of_var=real_t,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,type_of_var=real_t,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALPHA_BETA_GAMMA",&
variants=(/"ANGLES"/),&
@@ -148,19 +144,19 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
"ALPHA is the angle between B and C, BETA is the angle between A and C and "//&
"GAMMA the angle between A and B.",&
usage="ALPHA_BETA_GAMMA [deg] 90.0 90.0 120.0", unit_str="deg",&
- n_var=3,default_r_vals=(/cp_unit_to_cp2k(value=90.0_dp,unit_str="deg",error=error),&
- cp_unit_to_cp2k(value=90.0_dp,unit_str="deg",error=error),&
- cp_unit_to_cp2k(value=90.0_dp,unit_str="deg",error=error)/),&
- repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,default_r_vals=(/cp_unit_to_cp2k(value=90.0_dp,unit_str="deg"),&
+ cp_unit_to_cp2k(value=90.0_dp,unit_str="deg"),&
+ cp_unit_to_cp2k(value=90.0_dp,unit_str="deg")/),&
+ repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CELL_FILE_NAME",&
description="Possibility to read the cell from an external file ",&
repeats=.FALSE., usage="CELL_FILE_NAME ",&
- type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CELL_FILE_FORMAT",&
description="Specify the format of the cell file (if used)",&
@@ -169,9 +165,9 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
enum_i_vals=(/do_cell_cp2k,do_cell_xsc/),&
enum_desc=s2a("Cell info in the CP2K native format.",&
"Cell info in the XSC format (NAMD)" ),&
- default_i_val=do_cell_cp2k,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_cell_cp2k)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PERIODIC",&
description="Specify the directions for which periodic boundary conditions (PBC) will be applied. "//&
@@ -184,18 +180,18 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
enum_i_vals=(/ use_perd_x, use_perd_y, use_perd_z,&
use_perd_xy, use_perd_xz, use_perd_yz,&
use_perd_xyz, use_perd_none /),&
- default_i_val=my_periodic, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=my_periodic)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MULTIPLE_UNIT_CELL",&
description="Specifies the numbers of repetition in space (X, Y, Z) of the defined cell, "//&
"assuming it as a unit cell. This keyword affects only the CELL specification. The same keyword "//&
"in SUBSYS%TOPOLOGY%MULTIPLE_UNIT_CELL should be modified in order to affect the coordinates "//&
"specification.", usage="MULTIPLE_UNIT_CELL 1 1 1", &
- n_var=3,default_i_vals=(/1,1,1/),repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,default_i_vals=(/1,1,1/),repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SYMMETRY",&
description="Imposes an initial cell symmetry.",&
@@ -216,28 +212,24 @@ RECURSIVE SUBROUTINE create_cell_section(section,periodic,label,error)
enum_i_vals=(/cell_sym_none,cell_sym_triclinic,cell_sym_monoclinic,cell_sym_orthorhombic,&
cell_sym_tetragonal_ab,cell_sym_tetragonal_ac,cell_sym_tetragonal_bc,&
cell_sym_tetragonal_ab,cell_sym_rhombohedral,cell_sym_hexagonal,cell_sym_cubic/),&
- default_i_val=cell_sym_none,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=cell_sym_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
IF (TRIM(my_label)=="CELL") THEN
- CALL create_cell_section(subsection,periodic,"CELL_REF",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_cell_section(subsection,periodic,"CELL_REF")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END IF
END SUBROUTINE create_cell_section
! *****************************************************************************
!> \brief Creates the random number restart section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_rng_section(section,error)
+ SUBROUTINE create_rng_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_rng_section', &
routineP = moduleN//':'//routineN
@@ -247,18 +239,17 @@ SUBROUTINE create_rng_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="RNG_INIT",&
description="Information to initialize the parallel random number generator streams",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify an initial RNG stream record",repeats=.TRUE.,&
- usage="{RNG record string}",type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{RNG record string}",type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_rng_section
@@ -266,13 +257,10 @@ END SUBROUTINE create_rng_section
!> \brief creates the structure of a subsys, i.e. a full set of
!> atoms+mol+bounds+cell
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_subsys_section(section,error)
+ SUBROUTINE create_subsys_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_subsys_section', &
routineP = moduleN//':'//routineN
@@ -282,78 +270,74 @@ SUBROUTINE create_subsys_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="subsys",&
description="a subsystem: coordinates, topology, molecules and cell",&
- n_keywords=0, n_subsections=9, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=9, repeats=.FALSE.)
NULLIFY(subsection)
- CALL create_rng_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rng_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_cell_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_cell_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_coord_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_coord_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_velocity_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_velocity_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_kind_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_kind_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_topology_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_topology_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_colvar_section(section=subsection,error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_colvar_section(section=subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_multipole_section(subsection, error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_multipole_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_shell_coord_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_shell_coord_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_shell_vel_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_shell_vel_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_core_coord_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_core_coord_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_core_vel_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_core_vel_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_subsys_print_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_subsys_print_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_subsys_section
! *****************************************************************************
!> \brief Creates the subsys print section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_subsys_print_section(section,error)
+ SUBROUTINE create_subsys_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_subsys_print_section', &
routineP = moduleN//':'//routineN
@@ -365,245 +349,240 @@ SUBROUTINE create_subsys_print_section(section,error)
failure=.FALSE.
NULLIFY(print_key, keyword)
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Controls printings related to the subsys",&
- n_keywords=0, n_subsections=9, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=9, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"atomic_coordinates",&
description="controls the output of the atomic coordinates when setting up the"//&
"force environment. For printing coordinates during MD or GEO refer to the keyword"//&
" trajectory.",unit_str="angstrom",&
- print_level=medium_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
- CALL create_structure_data_section(print_key, error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL create_structure_data_section(print_key)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"interatomic_distances",&
description="controls the output of the interatomic distances when setting up the"//&
"force environment",unit_str="angstrom",&
- print_level=debug_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key, "topology_info", description=&
"controls the printing of information in the topology settings", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
CALL keyword_create(keyword,"xtl_info",&
description="Prints information when parsing XTL files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"cif_info",&
description="Prints information when parsing CIF files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"pdb_info",&
description="Prints information when parsing PDB files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"xyz_info",&
description="Prints information when parsing XYZ files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"psf_info",&
description="Prints information when parsing PSF files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"amber_info",&
description="Prints information when parsing ABER topology files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"g96_info",&
description="Prints information when parsing G96 files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"crd_info",&
description="Prints information when parsing CRD files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"gtop_info",&
description="Prints information when parsing GROMOS topology files.",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"util_info",&
description="Prints information regarding topology utilities",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"generate_info",&
description="Prints information regarding topology generation",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"cell",&
description="controls the output of the cell parameters",&
print_level=medium_print_level, filename="__STD_OUT__",&
- unit_str="angstrom",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ unit_str="angstrom")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"kinds",&
description="controls the output of information on the kinds",&
- print_level=medium_print_level, filename="__STD_OUT__",error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
CALL keyword_create(keyword, name="potential",&
description="If the printkey is activated controls the printing of the"//&
" fist_potential, gth_potential or all electron"//&
" potential information",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="basis_set",&
description="If the printkey is activated controls the printing of basis set information",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="se_parameters",&
description="If the printkey is activated controls the printing of the semi-empirical parameters.",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SYMMETRY",&
description="controls the output of symmetry information",&
- print_level=debug_print_level+1, filename="__STD_OUT__",error=error)
+ print_level=debug_print_level+1, filename="__STD_OUT__")
CALL keyword_create(keyword, name="MOLECULE",&
description="Assume the system is an isolated molecule",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_GEO",&
description="Accuracy required for symmetry detection",&
- default_r_val=1.e-4_dp, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.e-4_dp)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="STANDARD_ORIENTATION",&
description="Print molecular coordinates in standard orientation",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="INERTIA",&
description="Print molecular inertia tensor",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SYMMETRY_ELEMENTS",&
description="Print symmetry elements",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ALL",&
description="Print all symmetry information",&
- default_l_val=.FALSE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROTATION_MATRICES",&
description="All the rotation matrices of the point group",&
- default_l_val=.FALSE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHECK_SYMMETRY",&
description="Check if calculated symmetry has expected value."//&
" Use either Schoenfliess or Hermann-Maugin symbols",&
- default_c_val="NONE", error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ default_c_val="NONE")
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"molecules",&
description="controls the output of information on the molecules",&
- print_level=medium_print_level, filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=medium_print_level, filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"radii",&
description="controls the output of radii information",unit_str="angstrom",&
- print_level=high_print_level, filename="__STD_OUT__",error=error)
+ print_level=high_print_level, filename="__STD_OUT__")
CALL keyword_create(keyword, name="core_charges_radii",&
description="If the printkey is activated controls the printing of the radii of the core charges",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="pgf_radii",&
description="If the printkey is activated controls the printing of the core gaussian radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="set_radii",&
description="If the printkey is activated controls the printing of the set_radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="kind_radii",&
description="If the printkey is activated controls the printing of the kind_radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="core_charge_radii",&
description="If the printkey is activated controls the printing of the core_charge_radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="gth_ppl_radii",&
description="If the printkey is activated controls the printing of the "//&
"gth pseudo potential local radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="gth_ppnl_radii",&
description="If the printkey is activated controls the printing of the "//&
"gth pseudo potential non local radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="gapw_prj_radii",&
description="If the printkey is activated controls the printing of the gapw projector radii",&
- default_l_val=.TRUE., lone_keyword_l_val=.TRUE., error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE., lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_subsys_print_section
! *****************************************************************************
!> \brief Creates the multipole section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_multipole_section(section,error)
+ SUBROUTINE create_multipole_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_multipole_section', &
routineP = moduleN//':'//routineN
@@ -614,41 +593,38 @@ SUBROUTINE create_multipole_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="multipoles",&
description="Specifies the dipoles and quadrupoles for particles.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, subsection)
CALL section_create(subsection,name="dipoles",&
description="Specifies the dipoles of the particles.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The dipole components for each atom in the format:"//&
"Dx Dy Dz ",&
repeats=.TRUE., usage="{Real} {Real} {Real}",&
- type_of_var=real_t, n_var=3, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ type_of_var=real_t, n_var=3)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="quadrupoles",&
description="Specifies the quadrupoles of the particles.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The quadrupole components for each atom in the format:"//&
"Qxx Qxy Qxz Qyy "//&
"Qyz Qzz ",&
repeats=.TRUE., usage="{Real} {Real} {Real} {Real} {Real} {Real}",&
- type_of_var=real_t, n_var=6, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ type_of_var=real_t, n_var=6)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_multipole_section
@@ -656,12 +632,9 @@ END SUBROUTINE create_multipole_section
!> \brief creates structure data section for output.. both subsys (for initialization)
!> and motion section..
!> \param print_key ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
! *****************************************************************************
- SUBROUTINE create_structure_data_section(print_key,error)
+ SUBROUTINE create_structure_data_section(print_key)
TYPE(section_type), POINTER :: print_key
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_structure_data_section', &
@@ -671,7 +644,7 @@ SUBROUTINE create_structure_data_section(print_key,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(print_key),cp_failure_level,routineP,failure)
NULLIFY(keyword)
@@ -679,58 +652,55 @@ SUBROUTINE create_structure_data_section(print_key,error)
CALL cp_print_key_section_create(print_key,name="STRUCTURE_DATA",&
description="Request the printing of special structure data during a structure "//&
"optimization (in MOTION%PRINT) or when setting up a subsys (in SUBSYS%PRINT).",&
- print_level=high_print_level,filename="__STD_OUT__",unit_str="angstrom",error=error)
+ print_level=high_print_level,filename="__STD_OUT__",unit_str="angstrom")
CALL keyword_create(keyword, name="POSITION", variants=(/"POS"/),&
description="Print the position vectors in Cartesian coordinates of the atoms specified "//&
"by a list of their indices",&
usage="POSITION {integer} {integer} {integer}..{integer}",n_var=-1,repeats=.TRUE.,&
- type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POSITION_SCALED",variants=(/"POS_SCALED"/),&
description="Print the position vectors in scaled coordinates of the atoms specified "//&
"by a list of their indices",&
usage="POSITION_SCALED {integer} {integer} {integer}..{integer}",n_var=-1,repeats=.TRUE.,&
- type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="DISTANCE",variants=(/"DIS"/),&
description="Print the distance between the atoms a and b specified by their indices",&
usage="DISTANCE {integer} {integer}",n_var=2,repeats=.TRUE.,&
- type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="ANGLE",variants=(/"ANG"/),&
description="Print the angle formed by the atoms specified by their indices",&
usage="ANGLE {integer} {integer} {integer}",n_var=3, repeats=.TRUE.,&
- type_of_var=integer_t, error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DIHEDRAL_ANGLE",variants=s2a("DIHEDRAL","DIH"),&
description="Print the dihedral angle between the planes defined by the atoms (a,b,c) and "//&
"the atoms (b,c,d) specified by their indices",&
usage="DIHEDRAL_ANGLE {integer} {integer} {integer} {integer}",n_var=4,&
- repeats=.TRUE.,type_of_var=integer_t,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.,type_of_var=integer_t)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_structure_data_section
! *****************************************************************************
!> \brief Creates the velocity section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_velocity_section(section,error)
+ SUBROUTINE create_velocity_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_velocity_section', &
routineP = moduleN//':'//routineN
@@ -740,31 +710,29 @@ SUBROUTINE create_velocity_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="velocity",&
description="The velocities for simple systems or "//&
"the centroid mode in PI runs, xyz format by default",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="PINT_UNIT",&
description="Specify the units of measurement for the velocities "//&
"(currently works only for the path integral code). "//&
"All available CP2K units can be used.",&
usage="UNIT angstrom*au_t^-1",&
- default_c_val="bohr*au_t^-1",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_c_val="bohr*au_t^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The atomic velocities in the format:"//&
"vx vy vz "//&
"The same order as for the atomic coordinates is assumed.",&
repeats=.TRUE., usage="{Real} {Real} {Real}",&
- type_of_var=real_t, n_var=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_velocity_section
@@ -772,13 +740,10 @@ END SUBROUTINE create_velocity_section
! *****************************************************************************
!> \brief Creates the shell velocity section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_shell_vel_section(section,error)
+ SUBROUTINE create_shell_vel_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_shell_vel_section', &
routineP = moduleN//':'//routineN
@@ -788,12 +753,11 @@ SUBROUTINE create_shell_vel_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="shell_velocity",&
description="The velocities of shells for shell-model potentials, "//&
"in xyz format ",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
@@ -801,9 +765,9 @@ SUBROUTINE create_shell_vel_section(section,error)
"vx vy vz "//&
"The same order as for the shell particle coordinates is assumed.",&
repeats=.TRUE., usage="{Real} {Real} {Real}",&
- type_of_var=real_t, n_var=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_shell_vel_section
@@ -811,13 +775,10 @@ END SUBROUTINE create_shell_vel_section
! *****************************************************************************
!> \brief Creates the shell velocity section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_core_vel_section(section,error)
+ SUBROUTINE create_core_vel_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_core_vel_section', &
routineP = moduleN//':'//routineN
@@ -827,12 +788,11 @@ SUBROUTINE create_core_vel_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="core_velocity",&
description="The velocities of cores for shell-model potentials, "//&
"in xyz format ",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
@@ -840,9 +800,9 @@ SUBROUTINE create_core_vel_section(section,error)
"vx vy vz "//&
"The same order as for the core particle coordinates is assumed.",&
repeats=.TRUE., usage="{Real} {Real} {Real}",&
- type_of_var=real_t, n_var=3, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_core_vel_section
@@ -850,13 +810,10 @@ END SUBROUTINE create_core_vel_section
! *****************************************************************************
!> \brief Creates the &POTENTIAL section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_potential_section(section,error)
+ SUBROUTINE create_potential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_potential_section', &
routineP = moduleN//':'//routineN
@@ -868,27 +825,23 @@ SUBROUTINE create_potential_section(section,error)
CALL section_create(section,name="potential",&
description="Section used to specify Potentials.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="CP2K Pseudo Potential Standard Format (GTH, ALL)",&
- repeats=.TRUE.,type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.,type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_potential_section
! *****************************************************************************
!> \brief Creates the &KG_POTENTIAL section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author JGH
! *****************************************************************************
- SUBROUTINE create_kgpot_section(section,error)
+ SUBROUTINE create_kgpot_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_kgpot_section', &
routineP = moduleN//':'//routineN
@@ -900,27 +853,23 @@ SUBROUTINE create_kgpot_section(section,error)
CALL section_create(section,name="kg_potential",&
description="Section used to specify KG Potentials.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="CP2K KG TNADD Potential Standard Format (TNADD)",&
- repeats=.TRUE.,type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.,type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_kgpot_section
! *****************************************************************************
!> \brief Creates the &BASIS section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_basis_section(section,error)
+ SUBROUTINE create_basis_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_basis_section', &
routineP = moduleN//':'//routineN
@@ -932,20 +881,19 @@ SUBROUTINE create_basis_section(section,error)
CALL section_create(section,name="BASIS",&
description="Section used to specify a general basis set for QM calculations.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="The type of basis set defined in this section.",&
lone_keyword_c_val="Orbital",&
- usage="Orbital",default_c_val="Orbital", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="Orbital",default_c_val="Orbital")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
- repeats=.TRUE., type_of_var=lchar_t, error=error,&
+ repeats=.TRUE., type_of_var=lchar_t,&
description="CP2K Basis Set Standard Format"//newline//&
""//newline//&
"Element symbol Name of the basis set Alias names"//newline//&
@@ -969,21 +917,18 @@ SUBROUTINE create_basis_section(section,error)
"c : Contraction coefficient"//newline//&
" "//newline//&
"Source: ftp://ftp.aip.org/epaps/journ_chem_phys/E-JCPSA6-127-308733/BASIS_MOLOPT_JCP.txt")
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_basis_section
! *****************************************************************************
!> \brief Creates the &COORD section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_coord_section(section,error)
+ SUBROUTINE create_coord_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_coord_section', &
routineP = moduleN//':'//routineN
@@ -993,28 +938,26 @@ SUBROUTINE create_coord_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="coord",&
description="The coordinates for simple systems (like the QM ones)"//&
" xyz format by default. More complex systems should be given with"//&
" an external pdb file.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="UNIT",&
description='Specify the unit of measurement for the coordinates in input'//&
"All available CP2K units can be used.",&
- usage="UNIT angstrom",default_c_val="angstrom",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="UNIT angstrom",default_c_val="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALED",&
description='Specify if the coordinateds in input are scaled.',&
usage="SCALED F",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The atomic coordinates in the format:"//&
@@ -1022,21 +965,18 @@ SUBROUTINE create_coord_section(section,error)
"The MOLNAME is optional. If not provided the molecule name "//&
"is internally created. All other fields after MOLNAME are simply ignored.",&
repeats=.TRUE., usage="{{String} {Real} {Real} {Real} {String}}",&
- type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_coord_section
! *****************************************************************************
!> \brief Creates the &SHELL_COORD section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_shell_coord_section(section,error)
+ SUBROUTINE create_shell_coord_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_shell_coord_section', &
routineP = moduleN//':'//routineN
@@ -1046,36 +986,34 @@ SUBROUTINE create_shell_coord_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="shell_coord",&
description="The shell coordinates for the shell-model potentials"//&
" xyz format with an additional column for the index of the corresponding particle",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="UNIT",&
description='Specify the unit of measurement for the coordinates in input'//&
"All available CP2K units can be used.",&
- usage="UNIT angstrom",default_c_val="angstrom",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="UNIT angstrom",default_c_val="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALED",&
description='Specify if the coordinateds in input are scaled.',&
usage="SCALED F",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The shell particle coordinates in the format:"//&
"ATOMIC_KIND X Y Z ATOMIC_INDEX "//&
"The ATOMIC_INDEX refers to the atom the shell particle belongs to.",&
repeats=.TRUE., usage="{{String} {Real} {Real} {Real} {Integer}}",&
- type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_shell_coord_section
@@ -1083,13 +1021,10 @@ END SUBROUTINE create_shell_coord_section
! *****************************************************************************
!> \brief Creates the &core_COORD section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_core_coord_section(section,error)
+ SUBROUTINE create_core_coord_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_core_coord_section', &
routineP = moduleN//':'//routineN
@@ -1099,36 +1034,34 @@ SUBROUTINE create_core_coord_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="core_coord",&
description="The core coordinates for the shell-model potentials"//&
" xyz format with an additional column for the index of the corresponding particle",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="UNIT",&
description='Specify the unit of measurement for the coordinates in input'//&
"All available CP2K units can be used.",&
- usage="UNIT angstrom",default_c_val="angstrom",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="UNIT angstrom",default_c_val="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="SCALED",&
description='Specify if the coordinateds in input are scaled.',&
usage="SCALED F",default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="The core particle coordinates in the format:"//&
"ATOMIC_KIND X Y Z ATOMIC_INDEX "//&
"The ATOMIC_INDEX refers to the atom the core particle belongs to.",&
repeats=.TRUE., usage="{{String} {Real} {Real} {Real} {Integer}}",&
- type_of_var=lchar_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_core_coord_section
@@ -1136,13 +1069,10 @@ END SUBROUTINE create_core_coord_section
! *****************************************************************************
!> \brief Creates the QM/MM section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_kind_section(section,error)
+ SUBROUTINE create_kind_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_kind_section', &
routineP = moduleN//':'//routineN
@@ -1153,28 +1083,27 @@ SUBROUTINE create_kind_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="KIND",&
description="The description of the kind of the atoms (mostly for QM)",&
- n_keywords=19, n_subsections=1, repeats=.TRUE., &
- error=error)
+ n_keywords=19, n_subsections=1, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="The name of the kind described in this section.",&
- usage="H", default_c_val="DEFAULT", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="H", default_c_val="DEFAULT")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BASIS_SET",&
description="The primary Gaussian basis set (NONE implies no basis used, meaningful with GHOST)",&
usage="BASIS_SET [type] DZVP", type_of_var=char_t, default_c_vals=(/" "," "/), &
citations=(/VandeVondele2005a,VandeVondele2007/),&
- repeats=.TRUE., n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE., n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! old type basis set input keywords
! kept for back compatability
@@ -1182,126 +1111,117 @@ SUBROUTINE create_kind_section(section,error)
variants=s2a("AUXILIARY_BASIS_SET", "AUX_BASIS"),&
description="DEPRECATED (use BASIS_SET): The auxliliary basis set (GTO type)",&
usage="AUX_BASIS_SET DZVP", default_c_val=" ", &
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RI_AUX_BASIS_SET",&
variants=s2a("RI_MP2_BASIS_SET","RI_RPA_BASIS_SET", "RI_AUX_BASIS"),&
description="DEPRECATED (use BASIS_SET): The RI auxliliary basis set used in WF_CORRELATION (GTO type)",&
usage="RI_AUX_BASIS_SET DZVP", default_c_val=" ", &
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LRI_BASIS_SET",&
variants=s2a("LRI_BASIS"),&
description="DEPRECATED (use BASIS_SET): The local resolution of identity basis set (GTO type)",&
usage="LRI_BASIS_SET DZVP", default_c_val=" ", &
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="AUX_FIT_BASIS_SET",&
variants=s2a("AUXILIARY_FIT_BASIS_SET", "AUX_FIT_BASIS"),&
description="DEPRECATED (use BASIS_SET): The auxliliary basis set (GTO type) for auxiliary density matrix method",&
usage="AUX_FIT_BASIS_SET DZVP", default_c_val=" ", &
citations=(/Guidon2010/),&
- n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! end of old basis set keywords
CALL keyword_create(keyword, name="ELEC_CONF",&
description="Specifies the electronic configration used in construction the "// &
"atomic initial guess (see the pseudo potential file for the default values.",&
usage="ELEC_COND n_elec(s) n_elec(p) n_elec(d) ... ", &
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORE_CORRECTION",&
description="Corrects the effective nuclear charge",&
usage="CORE_CORRECTION 1.0", n_var=1, &
- default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ELEMENT",&
variants=(/ "ELEMENT_SYMBOL" /),&
description="The element of the actual kind "//&
"(if not given it is inferred from the kind name)",&
- usage="ELEMENT O", type_of_var=char_t,n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ELEMENT O", type_of_var=char_t,n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MASS",&
variants=s2a("ATOMIC_MASS", "ATOMIC_WEIGHT", "WEIGHT"),&
description="The mass of the atom "//&
"(if negative or non present it is inferred from the element symbol)",&
- usage="MASS 2.0", type_of_var=real_t,n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MASS 2.0", type_of_var=real_t,n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="POTENTIAL",&
variants=(/ "POT" /),&
description="The name of the pseudopotential for the defined kind.",&
usage="POTENTIAL ", default_c_val="GTH", n_var=1,&
- citations=(/Goedecker1996, Hartwigsen1998, Krack2005/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ citations=(/Goedecker1996, Hartwigsen1998, Krack2005/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="KG_POTENTIAL",&
variants=(/ "KG_POT" /),&
description="The name of the non-additive atomic kinetic energy potential.",&
- usage="KG_POTENTIAL ", default_c_val="NONE", n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="KG_POTENTIAL ", default_c_val="NONE", n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="HARD_EXP_RADIUS",&
description="The region where the hard density is supposed to be confined"//&
"(GAPW)(in Bohr, default is 1.2 for H and 1.512 otherwise)",&
- usage="HARD_EXP_RADIUS 0.9", type_of_var=real_t,n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="HARD_EXP_RADIUS 0.9", type_of_var=real_t,n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAX_RAD_LOCAL",&
description="Max radius for the basis functions used to"//&
" generate the local projectors in GAPW [Bohr]",&
- usage="MAX_RAD_LOCAL 15.0", default_r_val=13.0_dp*bohr,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_RAD_LOCAL 15.0", default_r_val=13.0_dp*bohr)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RHO0_EXP_RADIUS",&
description="the radius which defines the atomic region where "//&
"the hard compensation density is confined."//&
"should be less than HARD_EXP_RADIUS (GAPW)(Bohr, default equals HARD_EXP_RADIUS)",&
- usage="RHO_EXP_RADIUS 0.9", type_of_var=real_t,n_var=1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RHO_EXP_RADIUS 0.9", type_of_var=real_t,n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="LEBEDEV_GRID",&
description="The number of points for the angular part of "//&
"the local grid (GAPW)",&
- usage="LEBEDEV_GRID 40", default_i_val=50,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="LEBEDEV_GRID 40", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="RADIAL_GRID",&
description="The number of points for the radial part of "//&
"the local grid (GAPW)",&
- usage="RADIAL_GRID 70", default_i_val=50,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="RADIAL_GRID 70", default_i_val=50)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_RADIUS",&
description="Defines the radius of the electrostatic multipole "//&
@@ -1314,40 +1234,38 @@ SUBROUTINE create_kind_section(section,error)
"shell is treated as a Gaussian and the core is always a point "//&
"charge.",&
usage="MM_RADIUS {real}", default_r_val=0.0_dp, type_of_var=real_t,&
- unit_str="angstrom", n_var=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom", n_var=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="DFTB3_PARAM",&
description="The third order parameter (derivative of hardness) used in "//&
"diagonal DFTB3 correction.",&
- usage="DFTB3_PARAM 0.2", default_r_val=0.0_dp,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="DFTB3_PARAM 0.2", default_r_val=0.0_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MAO",&
description="The number of MAOs (Modified Atomic Orbitals) for this kind.",&
- usage="MAO 4", default_i_val=-1,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAO 4", default_i_val=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Logicals
CALL keyword_create(keyword, name="SE_P_ORBITALS_ON_H",&
description="Forces the usage of p-orbitals on H for SEMI-EMPIRICAL calculations. "//&
" This keyword applies only when the KIND is specifying an Hydrogen element. In all "//&
" other cases is simply ignored. ",&
- usage="SE_P_ORBITALS_ON_H",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SE_P_ORBITALS_ON_H",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="GPW_TYPE",&
description="Force one type to be treated by the GPW scheme,"//&
" whatever are its primitives, even if the GAPW method is used",&
- usage="GPW_TYPE",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="GPW_TYPE",default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="GHOST",&
@@ -1357,10 +1275,9 @@ SUBROUTINE create_kind_section(section,error)
"or to have a non-interacting particle with BASIS_SET NONE",&
usage="GHOST",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="NO_OPTIMIZE",&
@@ -1368,31 +1285,30 @@ SUBROUTINE create_kind_section(section,error)
" potential optimization schemes",&
usage="NO_OPTIMIZE",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY(subsection)
- CALL create_basis_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_basis_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_potential_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_potential_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_kgpot_section(subsection, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_kgpot_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_dft_plus_u_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_dft_plus_u_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_bs_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_bs_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_kind_section
@@ -1402,15 +1318,13 @@ END SUBROUTINE create_kind_section
!> different from default in initialization of the density matrix
!> it works only with GUESS ATOMIC
!> \param section ...
-!> \param error ...
!> \date 05.08.2009
!> \author MI
!> \version 1.0
! *****************************************************************************
- SUBROUTINE create_bs_section(section,error)
+ SUBROUTINE create_bs_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'create_bs_section', &
routineP = moduleN//':'//routineN
@@ -1421,7 +1335,7 @@ SUBROUTINE create_bs_section(section,error)
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,&
@@ -1432,8 +1346,7 @@ SUBROUTINE create_bs_section(section,error)
"It works only with GUESS ATOMIC.",&
n_keywords=0,&
n_subsections=2,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
NULLIFY (keyword,subsection)
@@ -1442,16 +1355,14 @@ SUBROUTINE create_bs_section(section,error)
description="controls the activation of the BS section",&
usage="&BS ON",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="ALPHA",description="alpha spin",&
n_keywords=3,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword,&
name="NEL",&
@@ -1460,10 +1371,9 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=-1,&
- usage="NEL 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NEL 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="L",&
@@ -1473,10 +1383,9 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=-1,&
- usage="L 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="L 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="N",&
@@ -1487,18 +1396,16 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=0,&
- usage="N 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="N 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BETA",description="beta spin",&
n_keywords=3,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword,&
name="NEL",&
@@ -1507,10 +1414,9 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=-1,&
- usage="NEL 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NEL 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="L",&
@@ -1520,10 +1426,9 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=-1,&
- usage="L 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="L 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="N",&
@@ -1534,13 +1439,12 @@ SUBROUTINE create_bs_section(section,error)
repeats=.FALSE.,&
n_var=-1,&
default_i_val=0,&
- usage="N 2",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="N 2")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_bs_section
@@ -1549,13 +1453,10 @@ END SUBROUTINE create_bs_section
!> \brief Create the topology section for FIST.. and the base is running running...
!> Contains all information regarding topology to be read in input file..
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_topology_section(section,error)
+ SUBROUTINE create_topology_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_topology_section', &
routineP = moduleN//':'//routineN
@@ -1566,12 +1467,11 @@ SUBROUTINE create_topology_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="TOPOLOGY",&
description="Section specifying information regarding how to handle the topology"// &
" for classical runs.",&
- n_keywords=5, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword, print_key)
! Logical
@@ -1579,55 +1479,54 @@ SUBROUTINE create_topology_section(section,error)
variants=(/ "CHARGE_O" /),&
description="Read MM charges from the OCCUP field of PDB file.",&
usage="CHARGE_OCCUP logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_BETA",&
variants=(/ "CHARGE_B" /),&
description="Read MM charges from the BETA field of PDB file.",&
usage="CHARGE_BETA logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_EXTENDED",&
description="Read MM charges from the very last field of PDB file (starting from column 81)."//&
" No limitations of number of digits.",&
usage="CHARGE_EXTENDED logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARA_RES",&
description="For a protein, each residue is now considered a molecule",&
usage="PARA_RES logical",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOL_CHECK",&
description="Check molecules have the same number of atom and names.",&
usage="MOL_CHECK logical",&
- default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.TRUE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="USE_G96_VELOCITY",&
description="Use the velocities in the G96 coordinate files as the starting velocity",&
usage="USE_G96_VELOCITY logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! Character
CALL keyword_create(keyword, name="COORD_FILE_NAME",&
variants=s2a("COORD_FILE"),&
description="Specifies the filename that contains coordinates.",&
- usage="COORD_FILE_NAME ",type_of_var=lchar_t,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="COORD_FILE_NAME ",type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COORD_FILE_FORMAT",&
variants=s2a("COORDINATE"),&
@@ -1646,9 +1545,9 @@ SUBROUTINE create_topology_section(section,error)
"Coordinates provided through a XTL (MSI native) file format",&
"Read the coordinates in CP2K &COORD section format from an external file. "//&
"NOTE: This file will be overwritten with the latest coordinates."),&
- default_i_val=do_coord_off,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_coord_off)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUMBER_OF_ATOMS",&
variants=s2a("NATOMS","NATOM"),&
@@ -1658,37 +1557,36 @@ SUBROUTINE create_topology_section(section,error)
n_var=1,&
type_of_var=integer_t,&
default_i_val=-1,&
- usage="NATOMS 768000",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NATOMS 768000")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL connectivity_framework(section, do_conn_generate, error)
+ CALL connectivity_framework(section, do_conn_generate)
CALL keyword_create(keyword, name="DISABLE_EXCLUSION_LISTS",&
description="Do not build any exclusion lists.",&
usage="DISABLE_EXCLUSION_LISTS",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_VDW",&
description="Specifies which kind of Van der Waals interaction to skip.",&
usage="EXCLUDE_VDW (1-1||1-2||1-3||1-4)", &
enum_c_vals=s2a("1-1","1-2","1-3","1-4"),&
enum_i_vals=(/do_skip_11,do_skip_12,do_skip_13, do_skip_14/),&
- default_i_val=do_skip_13,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_skip_13)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EXCLUDE_EI",&
description="Specifies which kind of Electrostatic interaction to skip.",&
usage="EXCLUDE_EI (1-1||1-2||1-3||1-4)", &
enum_c_vals=s2a("1-1","1-2","1-3","1-4"),&
enum_i_vals=(/do_skip_11,do_skip_12,do_skip_13, do_skip_14/),&
- default_i_val=do_skip_13,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_skip_13)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="AUTOGEN_EXCLUDE_LISTS",&
description="When True, the exclude lists are solely based on"//&
@@ -1704,83 +1602,83 @@ SUBROUTINE create_topology_section(section,error)
" not to be in the exclusion list, in case 1-4"//&
" exclusion is requested for VDW or EI interactions.",&
usage="AUTOGEN_EXCLUDE_LISTS logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MULTIPLE_UNIT_CELL",&
description="Specifies the numbers of repetition in space (X, Y, Z) of the defined cell, "//&
"assuming it as a unit cell. This keyword affects only the coordinates specification. The same keyword "//&
"in SUBSYS%CELL%MULTIPLE_UNIT_CELL should be modified in order to affect the cell "//&
"specification.", usage="MULTIPLE_UNIT_CELL 1 1 1", &
- n_var=3,default_i_vals=(/1,1,1/),repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=3,default_i_vals=(/1,1,1/),repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MEMORY_PROGRESSION_FACTOR",&
description="This keyword is quite technical and should normally not be changed by the user. It "//&
"affects the memory allocation during the construction of the topology. It does NOT affect the "//&
"memory used once the topology is built.",&
- n_var=1,default_r_val=1.2_dp,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=1,default_r_val=1.2_dp,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL cp_print_key_section_create(print_key,"DUMP_PDB",&
description="controls the dumping of the PDB at the starting geometry",&
- print_level=debug_print_level, filename="dump",error=error)
- CALL section_add_subsection(section,print_key,error=error)
+ print_level=debug_print_level, filename="dump")
+ CALL section_add_subsection(section,print_key)
CALL keyword_create(keyword, name="CHARGE_OCCUP",&
variants=(/"CHARGE_O"/),&
description="Write the MM charges to the OCCUP field of the PDB file",&
usage="CHARGE_OCCUP logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_BETA",&
variants=(/"CHARGE_B"/),&
description="Write the MM charges to the BETA field of the PDB file",&
usage="CHARGE_BETA logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CHARGE_EXTENDED",&
description="Write the MM charges to the very last field of the PDB file (starting from column 81)",&
usage="CHARGE_EXTENDED logical",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(print_key,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(print_key,keyword)
+ CALL keyword_release(keyword)
- CALL section_release(print_key,error=error)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"DUMP_PSF",&
description="controls the dumping of the PSF connectivity",&
- print_level=debug_print_level, filename="dump",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=debug_print_level, filename="dump")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
NULLIFY(subsection)
- CALL create_exclude_list_section(subsection, "EXCLUDE_VDW_LIST", error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_exclude_list_section(subsection, "EXCLUDE_VDW_LIST")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_exclude_list_section(subsection, "EXCLUDE_EI_LIST", error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_exclude_list_section(subsection, "EXCLUDE_EI_LIST")
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_center_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection, error=error)
+ CALL create_center_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_generate_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_generate_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_molset_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_molset_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_topology_section
@@ -1788,14 +1686,11 @@ END SUBROUTINE create_topology_section
!> \brief Setup a list of fine exclusion elements
!> \param section the section to create
!> \param header ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - 12.2009
! *****************************************************************************
- SUBROUTINE create_exclude_list_section(section, header, error)
+ SUBROUTINE create_exclude_list_section(section, header)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: header
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_exclude_list_section', &
routineP = moduleN//':'//routineN
@@ -1804,7 +1699,7 @@ SUBROUTINE create_exclude_list_section(section, header, error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword)
CALL section_create(section,TRIM(header),&
description="Speficy bonds (via atom kinds) for fine tuning of 1-2 "//&
@@ -1812,27 +1707,23 @@ SUBROUTINE create_exclude_list_section(section, header, error)
"applied to all bond kinds. When this section is present the 1-2 exclusion "//&
"is applied ONLY to the bonds defined herein. This section allows ONLY fine tuning of 1-2 "//&
"interactions. ",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="BOND",&
description="Specify the atom kinds involved in the bond for which 1-2 exclusion holds.",&
usage="BOND {KIND1} {KIND2}", type_of_var=char_t,&
- n_var=2, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_exclude_list_section
! *****************************************************************************
!> \brief Specify keywords used to center molecule in the box
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - University of Zurich - 06.2009
! *****************************************************************************
- SUBROUTINE create_center_section(section,error)
+ SUBROUTINE create_center_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_center_section', &
routineP = moduleN//':'//routineN
@@ -1841,41 +1732,36 @@ SUBROUTINE create_center_section(section,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword)
CALL section_create(section,"CENTER_COORDINATES",&
description="Allows centering the coordinates of the system in the box. "//&
"The centering point can be defined by the user.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="Controls the activation of the centering method",&
usage="&CENTER_COORDINATES T",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CENTER_POINT",&
description="Specify the point used for centering the coordinates. Default is to "//&
"center the system in cell/2. ", type_of_var=real_t, n_var=3,&
- repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_center_section
! *****************************************************************************
!> \brief Specify keywords used to setup several molecules with few connectivity files
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - University of Zurich - 08.2008
! *****************************************************************************
- SUBROUTINE create_molset_section(section,error)
+ SUBROUTINE create_molset_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_molset_section', &
routineP = moduleN//':'//routineN
@@ -1885,88 +1771,84 @@ SUBROUTINE create_molset_section(section,error)
TYPE(section_type), POINTER :: subsection, subsubsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword, subsection, subsubsection)
CALL section_create(section,name="MOL_SET",&
description="Specify the connectivity of a full system specifying the connectivity"//&
" of the fragments of the system.",&
- n_keywords=2, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.FALSE.)
! MOLECULES
CALL section_create(subsection,name="MOLECULE",&
description="Specify information about the connectivity of single molecules",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="NMOL",&
description="number of molecules ",&
- usage="NMOL {integer}", default_i_val=1,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="NMOL {integer}", default_i_val=1)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL connectivity_framework(subsection, do_conn_psf, error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL connectivity_framework(subsection, do_conn_psf)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! MERGE MOLECULES
CALL section_create(subsection,name="MERGE_MOLECULES",&
description="Enables the creation of connecting bridges (bonds, angles, torsions, impropers)"//&
" between the two or more molecules defined with independent connectivity.",&
- n_keywords=2, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.FALSE.)
CALL section_create(subsubsection,name="bonds",&
- description="Defines new bonds",n_keywords=2, n_subsections=0, repeats=.FALSE.,&
- error=error)
+ description="Defines new bonds",n_keywords=2, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Two integer indexes per line defining the new bond."//&
" Indexes must be relative to the full system and not to the single molecules",&
repeats=.TRUE.,&
- usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ usage="{Integer} {Integer}", type_of_var=integer_t, n_var=2)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
CALL section_create(subsubsection,name="angles",&
description="Defines new angles",n_keywords=2, n_subsections=0,&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Three integer indexes per line defining the new angle"//&
" Indexes must be relative to the full system and not to the single molecules",repeats=.TRUE.,&
- usage="{Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=3, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ usage="{Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=3)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
CALL section_create(subsubsection,name="torsions",&
description="Defines new torsions",n_keywords=2, n_subsections=0,&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Four integer indexes per line defining the new torsion"//&
" Indexes must be relative to the full system and not to the single molecules",repeats=.TRUE.,&
- usage="{Integer} {Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=4, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ usage="{Integer} {Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=4)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
CALL section_create(subsubsection,name="impropers",&
description="Defines new impropers",n_keywords=2, n_subsections=0,&
- repeats=.FALSE., error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Four integer indexes per line defining the new improper"//&
" Indexes must be relative to the full system and not to the single molecules",repeats=.TRUE.,&
- usage="{Integer} {Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=4, error=error)
- CALL section_add_keyword(subsubsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(subsection, subsubsection, error=error)
- CALL section_release(subsubsection,error=error)
+ usage="{Integer} {Integer} {Integer} {Integer}", type_of_var=integer_t, n_var=4)
+ CALL section_add_keyword(subsubsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(subsection, subsubsection)
+ CALL section_release(subsubsection)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_molset_section
@@ -1974,13 +1856,10 @@ END SUBROUTINE create_molset_section
! *****************************************************************************
!> \brief Specify keywords used to generate connectivity
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Teodoro Laino [tlaino] - University of Zurich - 08.2008
! *****************************************************************************
- SUBROUTINE create_generate_section(section,error)
+ SUBROUTINE create_generate_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_generate_section', &
routineP = moduleN//':'//routineN
@@ -1990,28 +1869,27 @@ SUBROUTINE create_generate_section(section,error)
TYPE(section_type), POINTER :: subsection
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword,subsection)
CALL section_create(section,name="GENERATE",&
description="Setup of keywords controlling the generation of the connectivity",&
- n_keywords=2, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=2, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="REORDER",&
description="Reorder a list of atomic coordinates into order so it can be packed correctly.",&
usage="REORDER ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CREATE_MOLECULES",&
description="Create molecules names and definition. Can be used to override the "//&
" molecules specifications of a possible input connectivity or to create molecules"//&
" specifications for file types as XYZ, missing of molecules definitions.",&
usage="CREATE_MOLECULES ",&
- default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE.,lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BONDPARM",&
description="Used in conjunction with BONDPARM_FACTOR to "//&
@@ -2021,176 +1899,164 @@ SUBROUTINE create_generate_section(section,error)
usage="BONDPARM (COVALENT||VDW)", &
enum_c_vals=s2a( "COVALENT", "VDW"),&
enum_i_vals=(/do_bondparm_covalent, do_bondparm_vdw/),&
- default_i_val=do_bondparm_covalent,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_bondparm_covalent)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BONDPARM_FACTOR",&
description="Used in conjunction with BONDPARM to help "//&
"determine wheather there is bonding between "//&
"two atoms based on a distance criteria.",&
- usage="bondparm_factor {real}", default_r_val=1.1_dp,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="bondparm_factor {real}", default_r_val=1.1_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="BONDLENGTH_MAX",&
description="Maximum distance to generate neighbor lists to build connectivity",&
usage="BONDLENGTH_MAX ",default_r_val=cp_unit_to_cp2k(value=3.0_dp,&
- unit_str="angstrom",error=error),unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword=keyword,name="BONDLENGTH_MIN",&
description="Minimum distance to generate neighbor lists to build connectivity",&
usage="BONDLENGTH_MIN ",default_r_val=cp_unit_to_cp2k(value=0.01_dp,&
- unit_str="angstrom",error=error),unit_str="angstrom",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom"),unit_str="angstrom")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
! BONDS
CALL section_create(subsection,name="BOND",&
description="Section used to add/remove bonds in the connectivity."//&
" Useful for systems with a complex connectivity, difficult to find out automatically.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the bond",&
usage="&BOND (ADD|REMOVE)",&
enum_c_vals=s2a("ADD","REMOVE"),&
enum_i_vals=(/do_add,do_remove/),&
- default_i_val=do_add,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_add)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies two atomic index united by a covalent bond",&
usage="ATOMS {integer} {integer}", type_of_var=integer_t, n_var=2,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! ANGLES
CALL section_create(subsection,name="ANGLE",&
description="Section used to add/remove angles in the connectivity."//&
" Useful for systems with a complex connectivity, difficult to find out automatically.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the bond",&
usage="&ANGLE (ADD|REMOVE)",&
enum_c_vals=s2a("ADD","REMOVE"),&
enum_i_vals=(/do_add,do_remove/),&
- default_i_val=do_add,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_add)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies two atomic index united by a covalent bond",&
usage="ATOMS {integer} {integer} {integer} ", type_of_var=integer_t, n_var=3,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! TORSIONS
CALL section_create(subsection,name="TORSION",&
description="Section used to add/remove torsion in the connectivity."//&
" Useful for systems with a complex connectivity, difficult to find out automatically.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the bond",&
usage="&TORSION (ADD|REMOVE)",&
enum_c_vals=s2a("ADD","REMOVE"),&
enum_i_vals=(/do_add,do_remove/),&
- default_i_val=do_add,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_add)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies two atomic index united by a covalent bond",&
usage="ATOMS {integer} {integer} {integer} {integer} ", type_of_var=integer_t, n_var=4,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! IMPROPERS
CALL section_create(subsection,name="IMPROPER",&
description="Section used to add/remove improper in the connectivity."//&
" Useful for systems with a complex connectivity, difficult to find out automatically.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword, name="_SECTION_PARAMETERS_",&
description="controls the activation of the bond",&
usage="&IMPROPER (ADD|REMOVE)",&
enum_c_vals=s2a("ADD","REMOVE"),&
enum_i_vals=(/do_add,do_remove/),&
- default_i_val=do_add,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_add)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ATOMS",&
description="Specifies two atomic index united by a covalent bond",&
usage="ATOMS {integer} {integer} {integer} {integer} ", type_of_var=integer_t, n_var=4,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! ISOLATED ATOMS
CALL section_create(subsection,name="ISOLATED_ATOMS",&
description=" This section specifies the atoms that one considers isolated. Useful when present "//&
- " ions in solution.",n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ " ions in solution.",n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of atomic indexes of the isolated ion",&
usage="LIST {integer}", type_of_var=integer_t, n_var=-1,&
- repeats=.TRUE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
! Neighbor lists keys and printing handling the construction of NL for the connectivity
- CALL create_neighbor_lists_section(subsection,error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_neighbor_lists_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
- CALL create_gen_print_section(subsection,error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gen_print_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_generate_section
! *****************************************************************************
!> \brief Create the print gen section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_gen_print_section(section,error)
+ SUBROUTINE create_gen_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gen_print_section', &
routineP = moduleN//':'//routineN
@@ -2199,27 +2065,25 @@ SUBROUTINE create_gen_print_section(section,error)
TYPE(section_type), POINTER :: print_key
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="print",&
description="Section of possible print options in GENERATE code.",&
- n_keywords=0, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=1, repeats=.FALSE.)
NULLIFY(print_key)
CALL cp_print_key_section_create(print_key,"NEIGHBOR_LISTS",&
description="Activates the printing of the neighbor lists used"//&
" for generating the connectivity.", print_level=high_print_level,&
- filename="", unit_str="angstrom", error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="", unit_str="angstrom")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"SUBCELL",&
description="Activates the printing of the subcells used for the"//&
"generation of neighbor lists for connectivity.", &
- print_level=high_print_level,filename="__STD_OUT__",&
- error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ print_level=high_print_level,filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_gen_print_section
@@ -2227,14 +2091,11 @@ END SUBROUTINE create_gen_print_section
!> \brief Specify keywords used to define connectivity
!> \param section the section to create
!> \param default ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE connectivity_framework(section,default,error)
+ SUBROUTINE connectivity_framework(section,default)
TYPE(section_type), POINTER :: section
INTEGER, INTENT(IN) :: default
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'connectivity_framework', &
routineP = moduleN//':'//routineN
@@ -2243,14 +2104,14 @@ SUBROUTINE connectivity_framework(section,default,error)
TYPE(keyword_type), POINTER :: keyword
failure=.FALSE.
- CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(keyword)
CALL keyword_create(keyword, name="CONN_FILE_NAME",&
variants=(/"CONN_FILE"/),&
description="Specifies the filename that contains the molecular connectivity.",&
- usage="CONN_FILE_NAME ",type_of_var=lchar_t,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CONN_FILE_NAME ",type_of_var=lchar_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CONN_FILE_FORMAT",&
variants=(/"CONNECTIVITY"/),&
@@ -2279,23 +2140,21 @@ SUBROUTINE connectivity_framework(section,default,error)
"Allows the definition of molecules and residues based on the 5th and 6th column of "//&
"the COORD section. This option can be handy for the definition of molecules with QS "//&
"or to save memory in the case of very large systems (use PARA_RES off)."),&
- default_i_val=default,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=default)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE connectivity_framework
! *****************************************************************************
!> \brief Create CP2K input section for the DFT+U method parameters
!> \param section ...
-!> \param error ...
!> \date 01.11.2007
!> \author Matthias Krack (MK)
!> \version 1.0
! *****************************************************************************
- SUBROUTINE create_dft_plus_u_section(section,error)
+ SUBROUTINE create_dft_plus_u_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(INOUT) :: error
CHARACTER(LEN=*), PARAMETER :: routineN = 'create_dft_plus_u_section', &
routineP = moduleN//':'//routineN
@@ -2306,7 +2165,7 @@ SUBROUTINE create_dft_plus_u_section(section,error)
failure = .FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,&
@@ -2314,8 +2173,7 @@ SUBROUTINE create_dft_plus_u_section(section,error)
description="Define the parameters for a DFT+U run",&
n_keywords=3,&
n_subsections=1,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
NULLIFY (keyword)
@@ -2324,10 +2182,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
description="Controls the activation of the DFT+U section",&
usage="&DFT_PLUS_U ON",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="L",&
@@ -2337,10 +2194,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
n_var=1,&
type_of_var=integer_t,&
default_i_val=-1,&
- usage="L 2",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="L 2")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="U_MINUS_J",&
@@ -2350,10 +2206,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
type_of_var=real_t,&
default_r_val=0.0_dp,&
unit_str="au_e",&
- usage="U_MINUS_J [eV] 1.4",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="U_MINUS_J [eV] 1.4")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="U_RAMPING",&
@@ -2364,10 +2219,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
type_of_var=real_t,&
default_r_val=0.0_dp,&
unit_str="au_e",&
- usage="U_RAMPING [eV] 0.1",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="U_RAMPING [eV] 0.1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="EPS_U_RAMPING",&
@@ -2377,10 +2231,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=1.0E-5_dp,&
- usage="EPS_U_RAMPING 1.0E-6",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_U_RAMPING 1.0E-6")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="INIT_U_RAMPING_EACH_SCF",&
@@ -2389,10 +2242,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
repeats=.FALSE.,&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- usage="INIT_U_RAMPING_EACH_SCF on",&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="INIT_U_RAMPING_EACH_SCF on")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
NULLIFY (subsection)
@@ -2404,18 +2256,16 @@ SUBROUTINE create_dft_plus_u_section(section,error)
"inadequate parameter choice can easily inhibit SCF convergence.",&
n_keywords=5,&
n_subsections=0,&
- repeats=.FALSE.,&
- error=error)
+ repeats=.FALSE.)
CALL keyword_create(keyword,&
name="_SECTION_PARAMETERS_",&
description="Controls the activation of the ENFORCE_OCCUPATION section",&
usage="&ENFORCE_OCCUPATION ON",&
default_l_val=.FALSE.,&
- lone_keyword_l_val=.TRUE.,&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="ORBITALS",&
@@ -2426,10 +2276,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
n_var=-1,&
type_of_var=integer_t,&
default_i_val=0,&
- usage="ORBITALS 0 +1 -1",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ORBITALS 0 +1 -1")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="EPS_SCF",&
@@ -2439,10 +2288,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
n_var=1,&
type_of_var=real_t,&
default_r_val=1.0E30_dp,&
- usage="EPS_SCF 0.001",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_SCF 0.001")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="MAX_SCF",&
@@ -2451,10 +2299,9 @@ SUBROUTINE create_dft_plus_u_section(section,error)
n_var=1,&
type_of_var=integer_t,&
default_i_val=-1,&
- usage="MAX_SCF 5",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="MAX_SCF 5")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,&
name="SMEAR",&
@@ -2462,13 +2309,12 @@ SUBROUTINE create_dft_plus_u_section(section,error)
repeats=.FALSE.,&
default_l_val=.FALSE.,&
lone_keyword_l_val=.TRUE.,&
- usage="SMEAR ON",&
- error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="SMEAR ON")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_dft_plus_u_section
diff --git a/src/input_cp2k_thermostats.F b/src/input_cp2k_thermostats.F
index 0a7f872b51..242f457fe7 100644
--- a/src/input_cp2k_thermostats.F
+++ b/src/input_cp2k_thermostats.F
@@ -61,14 +61,11 @@ MODULE input_cp2k_thermostats
!> \brief Specifies parameter for thermostat for constant temperature ensembles
!> \param section will contain the coeff section
!> \param coupled_thermostat ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo [tlaino] - University of Zurich - 09.2007
! *****************************************************************************
- SUBROUTINE create_thermo_slow_section(section, coupled_thermostat, error)
+ SUBROUTINE create_thermo_slow_section(section, coupled_thermostat)
TYPE(section_type), POINTER :: section
LOGICAL, INTENT(IN), OPTIONAL :: coupled_thermostat
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_thermo_slow_section', &
routineP = moduleN//':'//routineN
@@ -79,14 +76,14 @@ SUBROUTINE create_thermo_slow_section(section, coupled_thermostat, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
my_coupled_thermostat = .FALSE.
IF (PRESENT(coupled_thermostat)) my_coupled_thermostat = coupled_thermostat
NULLIFY(nose_section, region_section)
CALL section_create(section,name="THERMOSTAT_SLOW",&
description="Specify thermostat type and parameters controlling the thermostat.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
IF (.NOT.my_coupled_thermostat) THEN
@@ -96,10 +93,9 @@ SUBROUTINE create_thermo_slow_section(section, coupled_thermostat, error)
default_i_val=do_thermo_nose,&
enum_c_vals=s2a("NOSE"),&
enum_i_vals=(/do_thermo_nose/),&
- enum_desc=s2a("Uses only the Nose-Hoover thermostat."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_desc=s2a("Uses only the Nose-Hoover thermostat."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REGION",&
description="Determines the defined region for slow thermostat",&
@@ -107,13 +103,13 @@ SUBROUTINE create_thermo_slow_section(section, coupled_thermostat, error)
enum_c_vals=s2a( "GLOBAL", "MOLECULE", "MASSIVE", "DEFINED", "NONE"),&
enum_i_vals=(/do_region_global, do_region_molecule,&
do_region_massive, do_region_defined, do_region_none/),&
- default_i_val=do_region_global,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_region_global)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_region_section(region_section,"slow thermostat",error=error)
- CALL section_add_subsection(section, region_section, error=error)
- CALL section_release(region_section,error=error)
+ CALL create_region_section(region_section,"slow thermostat")
+ CALL section_add_subsection(section, region_section)
+ CALL section_release(region_section)
ELSE
CALL keyword_create(keyword, name="TYPE",&
description="Specify the thermostat used for the constant temperature ensembles.",&
@@ -123,20 +119,19 @@ SUBROUTINE create_thermo_slow_section(section, coupled_thermostat, error)
enum_i_vals=(/do_thermo_same_as_part,do_thermo_nose,do_thermo_csvr/),&
enum_desc=s2a("Use the same kind of thermostat used for particles.",&
"Uses the Nose-Hoover thermostat.",&
- "Uses the canonical sampling through velocity rescaling."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Uses the canonical sampling through velocity rescaling."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END IF
- CALL create_nose_section(nose_section, error=error)
- CALL section_add_subsection(section, nose_section, error=error)
- CALL section_release(nose_section,error=error)
+ CALL create_nose_section(nose_section)
+ CALL section_add_subsection(section, nose_section)
+ CALL section_release(nose_section)
! Print Section
-! CALL create_print_section(subsection, error=error)
-! CALL section_add_subsection(section, subsection, error=error)
-! CALL section_release(subsection,error=error)
+! CALL create_print_section(subsection)
+! CALL section_add_subsection(section, subsection)
+! CALL section_release(subsection)
END SUBROUTINE create_thermo_slow_section
@@ -144,14 +139,11 @@ END SUBROUTINE create_thermo_slow_section
!> \brief Specifies parameter for thermostat for constant temperature ensembles
!> \param section will contain the coeff section
!> \param coupled_thermostat ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo [tlaino] - University of Zurich - 09.2007
! *****************************************************************************
- SUBROUTINE create_thermo_fast_section(section, coupled_thermostat, error)
+ SUBROUTINE create_thermo_fast_section(section, coupled_thermostat)
TYPE(section_type), POINTER :: section
LOGICAL, INTENT(IN), OPTIONAL :: coupled_thermostat
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_thermo_fast_section', &
routineP = moduleN//':'//routineN
@@ -162,14 +154,14 @@ SUBROUTINE create_thermo_fast_section(section, coupled_thermostat, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
my_coupled_thermostat = .FALSE.
IF (PRESENT(coupled_thermostat)) my_coupled_thermostat = coupled_thermostat
NULLIFY(nose_section, region_section)
CALL section_create(section,name="THERMOSTAT_FAST",&
description="Specify thermostat type and parameters controlling the thermostat.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
IF (.NOT.my_coupled_thermostat) THEN
@@ -179,10 +171,9 @@ SUBROUTINE create_thermo_fast_section(section, coupled_thermostat, error)
default_i_val=do_thermo_nose,&
enum_c_vals=s2a("NOSE"),&
enum_i_vals=(/do_thermo_nose/),&
- enum_desc=s2a("Uses only the Nose-Hoover thermostat."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_desc=s2a("Uses only the Nose-Hoover thermostat."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REGION",&
description="Determines the defined region for fast thermostat",&
@@ -190,13 +181,13 @@ SUBROUTINE create_thermo_fast_section(section, coupled_thermostat, error)
enum_c_vals=s2a( "GLOBAL", "MOLECULE", "MASSIVE", "DEFINED", "NONE"),&
enum_i_vals=(/do_region_global, do_region_molecule,&
do_region_massive, do_region_defined, do_region_none/),&
- default_i_val=do_region_global,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_region_global)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_region_section(region_section,"fast thermostat",error=error)
- CALL section_add_subsection(section, region_section, error=error)
- CALL section_release(region_section,error=error)
+ CALL create_region_section(region_section,"fast thermostat")
+ CALL section_add_subsection(section, region_section)
+ CALL section_release(region_section)
ELSE
CALL keyword_create(keyword, name="TYPE",&
description="Specify the thermostat used for the constant temperature ensembles.",&
@@ -206,20 +197,19 @@ SUBROUTINE create_thermo_fast_section(section, coupled_thermostat, error)
enum_i_vals=(/do_thermo_same_as_part,do_thermo_nose,do_thermo_csvr/),&
enum_desc=s2a("Use the same kind of thermostat used for particles.",&
"Uses the Nose-Hoover thermostat.",&
- "Uses the canonical sampling through velocity rescaling."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Uses the canonical sampling through velocity rescaling."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END IF
- CALL create_nose_section(nose_section, error=error)
- CALL section_add_subsection(section, nose_section, error=error)
- CALL section_release(nose_section,error=error)
+ CALL create_nose_section(nose_section)
+ CALL section_add_subsection(section, nose_section)
+ CALL section_release(nose_section)
! Print Section
-! CALL create_print_section(subsection, error=error)
-! CALL section_add_subsection(section, subsection, error=error)
-! CALL section_release(subsection,error=error)
+! CALL create_print_section(subsection)
+! CALL section_add_subsection(section, subsection)
+! CALL section_release(subsection)
END SUBROUTINE create_thermo_fast_section
@@ -228,14 +218,11 @@ END SUBROUTINE create_thermo_fast_section
!> \brief Specifies parameter for thermostat for constant temperature ensembles
!> \param section will contain the coeff section
!> \param coupled_thermostat ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo [tlaino] - University of Zurich - 09.2007
! *****************************************************************************
- SUBROUTINE create_thermostat_section(section, coupled_thermostat, error)
+ SUBROUTINE create_thermostat_section(section, coupled_thermostat)
TYPE(section_type), POINTER :: section
LOGICAL, INTENT(IN), OPTIONAL :: coupled_thermostat
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_thermostat_section', &
routineP = moduleN//':'//routineN
@@ -248,14 +235,14 @@ SUBROUTINE create_thermostat_section(section, coupled_thermostat, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
my_coupled_thermostat = .FALSE.
IF (PRESENT(coupled_thermostat)) my_coupled_thermostat = coupled_thermostat
NULLIFY(csvr_section, gle_section, al_section, nose_section, subsection, region_section)
CALL section_create(section,name="THERMOSTAT",&
description="Specify thermostat type and parameters controlling the thermostat.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
IF (.NOT.my_coupled_thermostat) THEN
@@ -269,10 +256,9 @@ SUBROUTINE create_thermostat_section(section, coupled_thermostat, error)
enum_desc=s2a("Uses the Nose-Hoover thermostat.",&
"Uses the canonical sampling through velocity rescaling.",&
"Uses GLE thermostat",&
- "Uses adaptive-Langevin thermostat"),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Uses adaptive-Langevin thermostat"))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="REGION",&
description="Determines the region each thermostat is attached to.",&
@@ -280,13 +266,13 @@ SUBROUTINE create_thermostat_section(section, coupled_thermostat, error)
enum_c_vals=s2a( "GLOBAL", "MOLECULE", "MASSIVE", "DEFINED", "NONE"),&
enum_i_vals=(/do_region_global, do_region_molecule,&
do_region_massive, do_region_defined, do_region_none/),&
- default_i_val=do_region_global,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_region_global)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_region_section(region_section,"thermostat",error=error)
- CALL section_add_subsection(section, region_section, error=error)
- CALL section_release(region_section,error=error)
+ CALL create_region_section(region_section,"thermostat")
+ CALL section_add_subsection(section, region_section)
+ CALL section_release(region_section)
ELSE
CALL keyword_create(keyword, name="TYPE",&
description="Specify the thermostat used for the constant temperature ensembles.",&
@@ -296,44 +282,41 @@ SUBROUTINE create_thermostat_section(section, coupled_thermostat, error)
enum_i_vals=(/do_thermo_same_as_part,do_thermo_nose,do_thermo_csvr/),&
enum_desc=s2a("Use the same kind of thermostat used for particles.",&
"Uses the Nose-Hoover thermostat.",&
- "Uses the canonical sampling through velocity rescaling."),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ "Uses the canonical sampling through velocity rescaling."))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END IF
- CALL create_nose_section(nose_section, error=error)
- CALL section_add_subsection(section, nose_section, error=error)
- CALL section_release(nose_section,error=error)
+ CALL create_nose_section(nose_section)
+ CALL section_add_subsection(section, nose_section)
+ CALL section_release(nose_section)
- CALL create_csvr_section(csvr_section, error=error)
- CALL section_add_subsection(section, csvr_section, error=error)
- CALL section_release(csvr_section,error=error)
+ CALL create_csvr_section(csvr_section)
+ CALL section_add_subsection(section, csvr_section)
+ CALL section_release(csvr_section)
- CALL create_gle_section(gle_section, error=error)
- CALL section_add_subsection(section, gle_section, error=error)
- CALL section_release(gle_section,error=error)
+ CALL create_gle_section(gle_section)
+ CALL section_add_subsection(section, gle_section)
+ CALL section_release(gle_section)
- CALL create_al_section(al_section, error=error)
- CALL section_add_subsection(section, al_section, error=error)
- CALL section_release(al_section,error=error)
+ CALL create_al_section(al_section)
+ CALL section_add_subsection(section, al_section)
+ CALL section_release(al_section)
! Print Section
- CALL create_print_section(subsection, error=error)
- CALL section_add_subsection(section, subsection, error=error)
- CALL section_release(subsection,error=error)
+ CALL create_print_section(subsection)
+ CALL section_add_subsection(section, subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_thermostat_section
! *****************************************************************************
!> \brief Creates print section for thermostat section
!> \param section ...
-!> \param error ...
!> \author teo [tlaino] - University of Zurich - 02.2008
! *****************************************************************************
- SUBROUTINE create_print_section(section, error)
+ SUBROUTINE create_print_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_print_section', &
routineP = moduleN//':'//routineN
@@ -343,48 +326,44 @@ SUBROUTINE create_print_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
NULLIFY(print_key)
CALL section_create(section,name="PRINT",&
description="Collects all print_keys for thermostat",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
CALL cp_print_key_section_create(print_key,"THERMOSTAT_INFO",&
description="Controls output information of the corresponding thermostat.", &
print_level=low_print_level, common_iter_levels=1,&
- filename="__STD_OUT__",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="__STD_OUT__")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"TEMPERATURE",&
description="Controls the output of the temperatures of the regions corresponding to "//&
"the present thermostat", &
print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
CALL cp_print_key_section_create(print_key,"ENERGY",&
description="Controls the output of kinetic energy, and potential energy "//&
" of the defined thermostat.", print_level=high_print_level, common_iter_levels=1,&
- filename="",error=error)
- CALL section_add_subsection(section,print_key,error=error)
- CALL section_release(print_key,error=error)
+ filename="")
+ CALL section_add_subsection(section,print_key)
+ CALL section_release(print_key)
END SUBROUTINE create_print_section
! *****************************************************************************
!> \brief Creates a section to arbitrary define a region to thermostat
!> \param section will contain the coeff section
!> \param label ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_region_section(section, label, error)
+ SUBROUTINE create_region_section(section, label)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: label
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_region_section', &
routineP = moduleN//':'//routineN
@@ -394,29 +373,28 @@ SUBROUTINE create_region_section(section, label, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="DEFINE_REGION",&
description="This section provides the possibility to define arbitrary region "//&
" for the "//TRIM(label)//".",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="LIST",&
description="Specifies a list of atoms to thermostat.",&
usage="LIST {integer} {integer} .. {integer}", repeats=.TRUE.,&
- n_var=-1, type_of_var=integer_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1, type_of_var=integer_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MOLNAME",&
variants=(/"SEGNAME"/),&
description="Specifies the name of the molecules to thermostat",&
usage="MOLNAME WAT MEOH", repeats=.TRUE.,&
- n_var=-1,type_of_var=char_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ n_var=-1,type_of_var=char_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MM_SUBSYS",&
variants=(/"PROTEIN"/),&
@@ -427,9 +405,9 @@ SUBROUTINE create_region_section(section, label, error)
enum_desc=s2a("Thermostat nothing",&
"Only the MM atoms itself",&
"The full molecule/residue that contains a MM atom"),&
- default_i_val=do_constr_none,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_constr_none,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="QM_SUBSYS",&
description="In a QM/MM run all QM atoms are specified as a whole ensemble to be thermostated",&
@@ -439,22 +417,19 @@ SUBROUTINE create_region_section(section, label, error)
"Only the QM atoms itself",&
"The full molecule/residue that contains a QM atom"),&
enum_i_vals=(/do_constr_none,do_constr_atomic,do_constr_molec/),&
- default_i_val=do_constr_none,repeats=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=do_constr_none,repeats=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_region_section
! *****************************************************************************
!> \brief ...
!> \param section will contain the ewald section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author gloria
! *****************************************************************************
- SUBROUTINE create_nose_section(section, error)
+ SUBROUTINE create_nose_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_nose_section', &
routineP = moduleN//':'//routineN
@@ -465,59 +440,56 @@ SUBROUTINE create_nose_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="nose",&
description="paramameters of the Nose Hoover thermostat chain",&
- citations=(/Nose1984a,Nose1984b/),error=error)
+ citations=(/Nose1984a,Nose1984b/))
NULLIFY(keyword,subsection)
CALL keyword_create(keyword, name="length",&
description="length of the Nose-Hoover chain", usage="length integer", &
- default_i_val=3,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="Yoshida",&
description="order of the yoshida integretor used for the thermostat",&
usage="Yoshida integer", &
- default_i_val=3,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=3)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="timecon",&
description="timeconstant of the thermostat chain",&
usage="timecon ", &
- default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs",error=error),&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs"),&
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="mts", &
variants=s2a("multiple_time_steps","mult_t_steps"),&
description="number of multiple timesteps to be used for the NoseHoover chain",&
usage="mts integer", &
- default_i_val=2,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=2)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_coord_section(subsection,"NOSE HOOVER",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_coord_section(subsection,"NOSE HOOVER")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_velocity_section(subsection,"NOSE HOOVER",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_velocity_section(subsection,"NOSE HOOVER")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_mass_section(subsection,"NOSE HOOVER",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_mass_section(subsection,"NOSE HOOVER")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_force_section(subsection,"NOSE HOOVER",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_force_section(subsection,"NOSE HOOVER")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_nose_section
@@ -526,13 +498,11 @@ END SUBROUTINE create_nose_section
! *****************************************************************************
!> \brief ...
!> \param section ...
-!> \param error ...
!> \param
!> \author
! *****************************************************************************
- SUBROUTINE create_gle_section(section, error)
+ SUBROUTINE create_gle_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gle_section', &
routineP = moduleN//':'//routineN
@@ -543,62 +513,60 @@ SUBROUTINE create_gle_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="GLE",&
description="paramameters of the gle thermostat. This section can be generated "//&
" from https://epfl-cosmo.github.io/gle4md/index.html?page=matrix ",&
- citations=(/Ceriotti2009,Ceriotti2009b/),error=error)
+ citations=(/Ceriotti2009,Ceriotti2009b/))
NULLIFY(keyword, subsection)
CALL keyword_create(keyword, name="NDIM",&
description="Size of the gle matrix", usage="NDIM 6", &
- default_i_val=5, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=5)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="A_SCALE",&
description="scaling factor for matrix A (for generic matrix A, depends "//&
"on the characteristic frequency of the system).", usage="A_SCALE 0.5", &
- default_r_val=cp_unit_to_cp2k(1.0_dp,"ps^-1",error=error), unit_str="ps^-1", error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(1.0_dp,"ps^-1"), unit_str="ps^-1")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="A_LIST",&
description="A matrix The defaults give optimal sampling for most "//&
"cristalline and liquid compounds. Generated with the parameters set kv_4-4.a"//&
"centered on w_0=40 cm^-1.", usage="A_LIST real real real", &
type_of_var=real_t, unit_str="internal_cp2k",&
- n_var=-1, repeats=.TRUE., &
+ n_var=-1, repeats=.TRUE.)
! default_r_vals=(/ &
! 1.859575861256e+2_dp, 2.726385349840e-1_dp, 1.152610045461e+1_dp, -3.641457826260e+1_dp, 2.317337581602e+2_dp, &
! -2.780952471206e-1_dp, 8.595159180871e-5_dp, 7.218904801765e-1_dp, -1.984453934386e-1_dp, 4.240925758342e-1_dp, &
! -1.482580813121e+1_dp, -7.218904801765e-1_dp, 1.359090212128e+0_dp, 5.149889628035e+0_dp, -9.994926845099e+0_dp, &
! -1.037218912688e+1_dp, 1.984453934386e-1_dp, -5.149889628035e+0_dp, 2.666191089117e+1_dp, 1.150771549531e+1_dp, &
! 2.180134636042e+2_dp, -4.240925758342e-1_dp, 9.994926845099e+0_dp, -1.150771549531e+1_dp, 3.095839456559e+2_dp /), &
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="C_LIST",&
description="C matrix", usage="C_LIST real real real", &
unit_str="K_e",&
- type_of_var=real_t, n_var=-1, repeats=.TRUE., &
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t, n_var=-1, repeats=.TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_thermo_energy_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_thermo_energy_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_rng_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rng_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_gles_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_gles_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_gle_section
@@ -606,13 +574,10 @@ END SUBROUTINE create_gle_section
! *****************************************************************************
!> \brief Creates the gles section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_gles_section(section,error)
+ SUBROUTINE create_gles_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_gles_section', &
routineP = moduleN//':'//routineN
@@ -622,31 +587,27 @@ SUBROUTINE create_gles_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="s",&
description="The s variable for GLE used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify s variable for GLE thermostat ",repeats=.FALSE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_gles_section
! *****************************************************************************
!> \brief ...
!> \param section will contain the ewald section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo [tlaino] - University of Zurich - 09.2007
! *****************************************************************************
- SUBROUTINE create_csvr_section(section, error)
+ SUBROUTINE create_csvr_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_csvr_section', &
routineP = moduleN//':'//routineN
@@ -657,10 +618,10 @@ SUBROUTINE create_csvr_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="csvr",&
description="Parameters of the canonical sampling through velocity rescaling thermostat.",&
- citations=(/Bussi2007/),error=error)
+ citations=(/Bussi2007/))
NULLIFY(keyword, subsection)
@@ -670,31 +631,28 @@ SUBROUTINE create_csvr_section(section, error)
"initial equilibrations) and a large time constant would be adequate "//&
"to get weak thermostatting in production runs.",&
usage="timecon ", &
- default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs",error=error),&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs"),&
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_thermo_energy_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_thermo_energy_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_rng_section(subsection,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_rng_section(subsection)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_csvr_section
! *****************************************************************************
!> \brief ...
!> \param section will contain the adaptive langevin section
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author Noam [bernstei]
! *****************************************************************************
- SUBROUTINE create_al_section(section, error)
+ SUBROUTINE create_al_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_al_section', &
routineP = moduleN//':'//routineN
@@ -705,14 +663,14 @@ SUBROUTINE create_al_section(section, error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="ad_langevin",&
description="Parameters of the adaptive-Langevin thermostat."//&
" Known to work with NVT ensemble, but not tested with"//&
" other ensembles. Also tested with FIXED_ATOMS constraints, but"//&
" may not work with other constraints (restraints should be OK, but"//&
" haven't been well tested)",&
- citations=(/Jones2011/),error=error)
+ citations=(/Jones2011/))
NULLIFY(keyword, subsection)
@@ -722,10 +680,10 @@ SUBROUTINE create_al_section(section, error)
"initial equilibrations) and a large time constant would be adequate "//&
"to get weak thermostatting in production runs.",&
usage="timecon_nh ", &
- default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs",error=error),&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs"),&
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="timecon_langevin",&
description="Time constant of the Langevin part of the AD_LANGEVIN thermostat. A small time "//&
@@ -733,18 +691,18 @@ SUBROUTINE create_al_section(section, error)
"initial equilibrations) and a large time constant would be adequate "//&
"to get weak thermostatting in production runs.",&
usage="timecon_langevin ", &
- default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs",error=error),&
- unit_str="fs",error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=cp_unit_to_cp2k(1000.0_dp,"fs"),&
+ unit_str="fs")
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
- CALL create_thermo_chi_mass_section(subsection,"CHI",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_thermo_chi_mass_section(subsection,"CHI")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
- CALL create_thermo_chi_mass_section(subsection,"MASS",error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL create_thermo_chi_mass_section(subsection,"MASS")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_al_section
@@ -753,14 +711,11 @@ END SUBROUTINE create_al_section
!> \brief Creates the thermostat chi restarting section
!> \param section the section to create
!> \param sec_name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_thermo_chi_mass_section(section,sec_name,error)
+ SUBROUTINE create_thermo_chi_mass_section(section,sec_name)
TYPE(section_type), POINTER :: section
CHARACTER(len=*) :: sec_name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: &
routineN = 'create_thermo_chi_mass_section', &
@@ -771,32 +726,28 @@ SUBROUTINE create_thermo_chi_mass_section(section,sec_name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name=TRIM(sec_name),&
description="Information to initialize the Ad-Langevin thermostat DOF "//TRIM(sec_name),&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify an initial thermostat DOF "//TRIM(sec_name)//&
" for Ad-Langevin thermostat.",repeats=.TRUE.,&
- unit_str="fs^-1",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="fs^-1",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_thermo_chi_mass_section
! *****************************************************************************
!> \brief Creates the thermostat energy restarting section
!> \param section the section to create
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_thermo_energy_section(section,error)
+ SUBROUTINE create_thermo_energy_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_thermo_energy_section', &
routineP = moduleN//':'//routineN
@@ -806,18 +757,17 @@ SUBROUTINE create_thermo_energy_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="THERMOSTAT_ENERGY",&
description="Information to initialize the CSVR thermostat energy.",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify an initial thermostat energy for CSVR thermostat.",&
- repeats=.TRUE., unit_str="internal_cp2k",type_of_var=real_t, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ repeats=.TRUE., unit_str="internal_cp2k",type_of_var=real_t)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_thermo_energy_section
@@ -825,14 +775,11 @@ END SUBROUTINE create_thermo_energy_section
!> \brief Creates the mass section
!> \param section the section to create
!> \param name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_force_section(section,name,error)
+ SUBROUTINE create_force_section(section,name)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_force_section', &
routineP = moduleN//':'//routineN
@@ -842,18 +789,17 @@ SUBROUTINE create_force_section(section,name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="force",&
description="The forces for "//TRIM(name)//" used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify masses of the system",repeats=.FALSE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_force_section
@@ -861,14 +807,11 @@ END SUBROUTINE create_force_section
!> \brief Creates the mass section
!> \param section the section to create
!> \param name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_mass_section(section,name,error)
+ SUBROUTINE create_mass_section(section,name)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_mass_section', &
routineP = moduleN//':'//routineN
@@ -878,18 +821,17 @@ SUBROUTINE create_mass_section(section,name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="mass",&
description="The masses for "//TRIM(name)//" used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify masses of the system",repeats=.FALSE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_mass_section
@@ -897,14 +839,11 @@ END SUBROUTINE create_mass_section
!> \brief Creates the velocity section
!> \param section the section to create
!> \param name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_velocity_section(section,name,error)
+ SUBROUTINE create_velocity_section(section,name)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_velocity_section', &
routineP = moduleN//':'//routineN
@@ -914,18 +853,17 @@ SUBROUTINE create_velocity_section(section,name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="velocity",&
description="The velocities for "//TRIM(name)//" used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify velocities of the system",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_velocity_section
@@ -933,14 +871,11 @@ END SUBROUTINE create_velocity_section
!> \brief Creates the coord section
!> \param section the section to create
!> \param name ...
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author teo
! *****************************************************************************
- SUBROUTINE create_coord_section(section,name,error)
+ SUBROUTINE create_coord_section(section,name)
TYPE(section_type), POINTER :: section
CHARACTER(LEN=*), INTENT(IN) :: name
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_coord_section', &
routineP = moduleN//':'//routineN
@@ -950,18 +885,17 @@ SUBROUTINE create_coord_section(section,name,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="coord",&
description="The positions for "//TRIM(name)//" used for restart",&
- n_keywords=1, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.FALSE.)
NULLIFY(keyword)
CALL keyword_create(keyword, name="_DEFAULT_KEYWORD_",&
description="Specify positions of the system",repeats=.TRUE.,&
- usage="{Real} ...", type_of_var=real_t, n_var=-1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="{Real} ...", type_of_var=real_t, n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_coord_section
diff --git a/src/input_cp2k_transport.F b/src/input_cp2k_transport.F
index 77dbb0c4e5..74a3459cb5 100644
--- a/src/input_cp2k_transport.F
+++ b/src/input_cp2k_transport.F
@@ -42,11 +42,9 @@ MODULE input_cp2k_transport
! *****************************************************************************
!> \brief creates the TRABSPORT section
!> \param[inout] section the section to be created
-!> \param[inout] error CP2K error
! *****************************************************************************
- SUBROUTINE create_transport_section(section,error)
+ SUBROUTINE create_transport_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_transport_section', &
routineP = moduleN//':'//routineN
@@ -56,12 +54,11 @@ SUBROUTINE create_transport_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,"TRANSPORT",&
description="Specifies the parameters for transport, sets parameters for the OMEN code, "//&
"see also http://www.nano-tcad.ethz.ch/ ",&
- n_keywords=19, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=19, n_subsections=0, repeats=.FALSE.)
NULLIFY (keyword)
@@ -74,118 +71,117 @@ SUBROUTINE create_transport_section(section,error)
"transport code",&
"experimental code",&
"miscellaneous method"),&
- enum_i_vals=(/scalapack_diagonalization, do_transport, exper_code, misc_method/),&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ enum_i_vals=(/scalapack_diagonalization, do_transport, exper_code, misc_method/))
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="BANDWIDTH",&
description="The number of neighboring unit cells that one unit cell interacts with.",&
- usage="BANDWIDTH ", default_i_val=2, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="BANDWIDTH ", default_i_val=2)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_CELLS",&
description="The number of unit cells.",&
- usage="N_CELLS ", default_i_val=5, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="N_CELLS ", default_i_val=5)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_ABSCISSAE",&
description="The number of abscissae per integration interval on the real axis.",&
- usage="N_ABSCISSAE ", default_i_val=0, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="N_ABSCISSAE ", default_i_val=0)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_KPOINTS",&
description="The number of k points for determination of the singularities.",&
- usage="N_KPOINTS ", default_i_val=64, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="N_KPOINTS ", default_i_val=64)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_INTERVAL",&
description="Max number of energy points per small interval.",&
- usage="NUM_INTERVAL ", default_i_val=10, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="NUM_INTERVAL ", default_i_val=10)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="NUM_CONTACTS",&
description="The number of contacts.",&
- usage="NUM_CONTACTS ", default_i_val=2, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="NUM_CONTACTS ", default_i_val=2)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="N_DOF",&
description="Number of degrees of freedom for the contact unit cell.",&
- usage="N_DOF ", default_i_val=0, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="N_DOF ", default_i_val=0)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TASKS_PER_POINT",&
description="Minimum number of tasks per energy point.",&
- usage="TASKS_PER_POINT ", default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="TASKS_PER_POINT ", default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CORES_PER_NODE",&
description="Number of cores per node.",&
- usage="CORES_PER_NODE ", default_i_val=1, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CORES_PER_NODE ", default_i_val=1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="COLZERO_THRESHOLD",&
description="The smallest number that is not zero in the full diagonalization part.",&
- usage="COLZERO_THRESHOLD ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="COLZERO_THRESHOLD ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_LIMIT",&
description="The smallest eigenvalue that is kept.",&
- usage="EPS_LIMIT ", default_r_val=1.0E-6_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="EPS_LIMIT ", default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_DECAY",&
description="The smallest imaginary part that a decaying eigenvalue may have not to be considered as propagating.",&
- usage="EPS_DECAY ", default_r_val=1.0E-6_dp, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="EPS_DECAY ", default_r_val=1.0E-6_dp)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_SINGULARITY_CURVATURES",&
description="Filter for degenerate bands in the bandstructure.",&
- usage="EPS_SINGULARITY_CURVATURES ", default_r_val=1.0E-12_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="EPS_SINGULARITY_CURVATURES ", default_r_val=1.0E-12_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_MU",&
description="Accuracy to which the Fermi level should be determined.",&
- usage="EPS_MU ", default_r_val=0.0_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="EPS_MU ", default_r_val=0.0_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="EPS_EIGVAL_DEGEN",&
description="Filter for degenerate bands in the injection vector.",&
- usage="EPS_EIGVAL_DEGEN ", default_r_val=1.0E-4_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="EPS_EIGVAL_DEGEN ", default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ENERGY_INTERVAL",&
description="Average distance for big intervals in energy vector.",&
- usage="ENERGY_INTERVAL ", default_r_val=1.0E-2_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="ENERGY_INTERVAL ", default_r_val=1.0E-2_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="MIN_INTERVAL",&
description="Smallest enery distance in energy vector.",&
- usage="MIN_INTERVAL ", default_r_val=1.0E-4_dp, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="MIN_INTERVAL ", default_r_val=1.0E-4_dp)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="TEMPERATURE",&
description="Temperature.",&
- usage="TEMPERATURE [K] 300.0", default_r_val=300.0_dp, unit_str="K", error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ usage="TEMPERATURE [K] 300.0", default_r_val=300.0_dp, unit_str="K")
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="ROW_DISTRIBUTION",&
description="How to distribute matrix rows over tasks.",&
@@ -194,15 +190,15 @@ SUBROUTINE create_transport_section(section,error)
"Each task holds ceiling(N/TASKS_PER_POINT) rows for a total of N matrix rows",&
"Each task holds floor(N/TASKS_PER_POINT) rows for a total of N matrix rows"),&
enum_i_vals=(/csr_dbcsr_blkrow_dist,csr_eqrow_ceil_dist,csr_eqrow_floor_dist/),&
- default_i_val=csr_dbcsr_blkrow_dist, error=error)
- CALL section_add_keyword(section, keyword, error=error)
- CALL keyword_release(keyword, error=error)
+ default_i_val=csr_dbcsr_blkrow_dist)
+ CALL section_add_keyword(section, keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="CSR_SCREENING",&
description="Whether distance screening should be applied to improve sparsity of CSR matrices.",&
- default_l_val=.FALSE., lone_keyword_l_val = .TRUE. ,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_l_val=.FALSE., lone_keyword_l_val = .TRUE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_transport_section
diff --git a/src/input_cp2k_xc.F b/src/input_cp2k_xc.F
index 7cbcba4f55..4ca503aed3 100644
--- a/src/input_cp2k_xc.F
+++ b/src/input_cp2k_xc.F
@@ -68,13 +68,10 @@ MODULE input_cp2k_xc
! *****************************************************************************
!> \brief creates the structure of the section needed to select the xc functional
!> \param section the section that will be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author fawzi
! *****************************************************************************
- SUBROUTINE create_xc_fun_section(section,error)
+ SUBROUTINE create_xc_fun_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_xc_fun_section', &
routineP = moduleN//':'//routineN
@@ -85,14 +82,13 @@ SUBROUTINE create_xc_fun_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="xc_functional",&
description="The xc functional to use",&
n_keywords=0, n_subsections=4, repeats=.FALSE., &
citations=(/Ortiz1994,Becke1988,Perdew1996,Zhang1998,Lee1988, &
Heyd2004,Vosko1980, Goedecker1996,Perdew1981,&
- Tao2003,Wellendorff2012/),&
- error=error)
+ Tao2003,Wellendorff2012/))
NULLIFY(subsection,keyword)
CALL keyword_create(keyword,name="_SECTION_PARAMETERS_",&
@@ -104,206 +100,195 @@ SUBROUTINE create_xc_fun_section(section,error)
enum_desc=s2a("B3LYP","PBE0","BLYP","BP","PADE","Alias for PADE","PBE","TPSS","HCTH120","OLYP",&
"BEEFVDW","NO_SHORTCUT","NONE"),&
default_i_val=xc_funct_no_shortcut,&
- lone_keyword_i_val=xc_funct_no_shortcut,&
- error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_i_val=xc_funct_no_shortcut)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="BECKE88",&
description="Uses the Becke 88 exchange functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Becke1988/),&
- error=error)
+ citations=(/Becke1988/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="LYP_ADIABATIC",&
description="Uses the LYP correlation functional in an adiabatic fashion",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Lee1988/),&
- error=error)
+ citations=(/Lee1988/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"LAMBDA",&
description="Defines the parameter of the adiabatic curve.",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BECKE88_LR_ADIABATIC",&
description="Uses the Becke 88 longrange exchange functional in an adiabatic fashion",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Becke1988/),&
- error=error)
+ citations=(/Becke1988/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"OMEGA",&
description="Potential parameter in erf(omega*r)/r",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"LAMBDA",&
description="Defines the parameter of the adiabatic curve",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BECKE88_LR",&
description="Uses the Becke 88 longrange exchange functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Becke1988/),&
- error=error)
+ citations=(/Becke1988/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"OMEGA",&
description="Potential parameter in erf(omega*r)/r",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="LYP",&
description="Uses the LYP functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Lee1988/),&
- error=error)
+ citations=(/Lee1988/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="PADE",&
description="Uses the PADE functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Goedecker1996/),&
- error=error)
+ citations=(/Goedecker1996/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="HCTH",&
description="Uses the HCTH class of functionals",&
- n_keywords=0, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,name="PARAMETER_SET",&
description="Which version of the parameters should be used",&
usage="PARAMETER_SET 407",&
enum_c_vals=(/"93 ","120","147","407"/),&
enum_i_vals=(/93,120,147,407/),&
- default_i_val=120,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=120)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="OPTX",&
description="Uses the OPTX functional",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL create_libxc_section(subsection, "LIBXC",&
"Uses functionals from LIBXC, see also "//&
"http://www.tddft.org/programs/octopus/wiki/index.php/Libxc_functionals ",&
- "FUNCTIONAL GGA_X_PBE GGA_C_PBE", error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ "FUNCTIONAL GGA_X_PBE GGA_C_PBE")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL create_libxc_section(subsection, "KE_LIBXC",&
"To be used for KG runs. Uses kinetic energy functionals from LIBXC, "//&
"see also http://www.tddft.org/programs/octopus/wiki/index.php/Libxc_functionals ",&
- "FUNCTIONAL GGA_K_LLP", error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ "FUNCTIONAL GGA_K_LLP")
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="CS1",&
description="Uses the CS1 functional",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="XGGA",&
description="Uses one of the XGGA functionals (optimized versions of "//&
"some of these functionals might be available outside this section).",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="FUNCTIONAL",&
description="Which one of the XGGA functionals should be used",&
usage="FUNCTIONAL PW86X",&
@@ -316,24 +301,23 @@ SUBROUTINE create_xc_fun_section(section,error)
"OPTX ",&
"EV93 "/),&
enum_i_vals=(/xgga_b88x,xgga_pw86,xgga_pw91,xgga_pbex,xgga_revpbe,xgga_opt,xgga_ev93/),&
- default_i_val=xgga_b88x,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=xgga_b88x)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="KE_GGA",&
description="Uses one of the KE_GGA functionals (optimized versions of "//&
"some of these functionals might be available outside this section). "//&
"These functionals are needed for the computation of the kinetic "//&
"energy in the Kim-Gordon method.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="FUNCTIONAL",&
description="Which one of the KE_GGA functionals should be used",&
usage="FUNCTIONAL (OL1|OL2|LLP|PW86|PW91|LC|T92|PBE)",&
@@ -347,43 +331,41 @@ SUBROUTINE create_xc_fun_section(section,error)
"Uses Lembarki and Chermette functional",&
"Uses Thakkar functional",&
"Uses the 1996 functional of Perdew, Burke and Ernzerhof"),&
- default_i_val=ke_llp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=ke_llp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="P86C",&
description="Uses the P86C functional",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="PW92",&
description="Uses the PerdewWang correlation functional.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"SCALE",&
description="Scaling of the energy functional",&
- default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="PARAMETRIZATION",&
description="Which one of parametrizations should be used",&
usage="PARAMETRIZATION DMC",&
@@ -392,21 +374,21 @@ SUBROUTINE create_xc_fun_section(section,error)
"DMC ",&
"VMC "/),&
enum_i_vals=(/c_pw92,c_pw92dmc,c_pw92vmc/),&
- default_i_val=c_pw92,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_i_val=c_pw92)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="PZ81",&
description="Uses the PZ functional.",&
n_keywords=1, n_subsections=0, repeats=.TRUE., &
- citations=(/Perdew1981,Ortiz1994/), error=error)
+ citations=(/Perdew1981,Ortiz1994/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="PARAMETRIZATION",&
description="Which one of parametrizations should be used",&
usage="PARAMETRIZATION DMC",&
@@ -415,56 +397,53 @@ SUBROUTINE create_xc_fun_section(section,error)
"DMC ",&
"VMC "/),&
enum_i_vals=(/c_pz,c_pzdmc,c_pzvmc/),&
- default_i_val=pz_orig,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=pz_orig)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="TFW",&
description="Uses the TFW functional",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="TF",&
description="Uses the TF functional",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="VWN",&
description="Uses the VWN functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Vosko1980/),&
- error=error)
+ citations=(/Vosko1980/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="FUNCTIONAL_TYPE",&
description="Which version of the VWN functional should be used",&
@@ -474,68 +453,66 @@ SUBROUTINE create_xc_fun_section(section,error)
enum_desc=s2a("This is the recommended (correct) version of the VWN functional", &
"This version is the default in Gaussian, but not recommended."//&
"Notice that it is also employed in Gaussian's default version of B3LYP"),&
- default_i_val=do_vwn5, error=error)
+ default_i_val=do_vwn5)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="XALPHA",&
description="Uses the XALPHA (SLATER) functional.",&
- n_keywords=1, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=1, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="XA",&
description="Value of the xa parameter (this does not change the exponent, "//&
"just the mixing)",&
- usage="XA 0.7", default_r_val=2._dp/3._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="XA 0.7", default_r_val=2._dp/3._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="TPSS",&
description="Uses the TPSS functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Tao2003/), error=error)
+ citations=(/Tao2003/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="PBE",&
description="Uses the PBE functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Perdew1996,Zhang1998,Perdew2008/),&
- error=error)
+ citations=(/Perdew1996,Zhang1998,Perdew2008/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"parametrization",&
description="switches between the different "//&
"parametrizations of the functional",&
@@ -544,200 +521,193 @@ SUBROUTINE create_xc_fun_section(section,error)
enum_desc=(/"original PBE ",&
"revised PBE (revPBE) ",&
"PBE for solids and surfaces (PBEsol)"/),&
- default_i_val=xc_pbe_orig,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=xc_pbe_orig)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="XWPBE",&
description="Uses the short range PBE functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Heyd2004/),&
- error=error)
+ citations=(/Heyd2004/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x0",&
description="scales the exchange part of the original hole PBE-functional",&
- default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"omega",&
description="screening parameter",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BECKE97",&
description="Uses the Becke 97 exchange correlation functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Becke1997,Grimme2006/),&
- error=error)
+ citations=(/Becke1997,Grimme2006/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional, if -1 the default for the given parametrization is used",&
- default_r_val=-1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=-1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_c",&
description="scales the correlation part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"parametrization",&
description="switches between the B97 and Grimme parametrization ",&
enum_i_vals=(/xc_b97_orig,xc_b97_grimme,xc_b97_grimme,xc_b97_mardirossian/),&
enum_c_vals=(/"ORIG ","B97GRIMME ","B97_GRIMME","wB97X-V "/),&
- default_i_val=xc_b97_orig,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=xc_b97_orig)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BECKE_ROUSSEL",&
description="Becke Roussel exchange hole model. Can be used"//&
"as long range correction with a truncated coulomb potential",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/BeckeRoussel1989,Proynov2007/),&
- error=error)
+ citations=(/BeckeRoussel1989,Proynov2007/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"CUTOFF_RADIUS",&
description="Defines the cutoff radius for the truncation. "//&
"If put to zero, the standard full range potential will be used",&
- usage="CUTOFF_RADIUS 2.0",default_r_val=0.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="CUTOFF_RADIUS 2.0",default_r_val=0.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"GAMMA",&
description="Parameter in the exchange hole. "//&
"Usually this is put to 1.0 or 0.8",&
- usage="GAMMA 0.8",default_r_val=1.0_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="GAMMA 0.8",default_r_val=1.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="LDA_HOLE_T_C_LR",&
description="LDA exchange hole model in truncated coulomb potential",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"SCALE_X",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"CUTOFF_RADIUS",&
description="Defines cutoff for lower integration boundary",&
- default_r_val=0.0_dp,unit_str="angstrom", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=0.0_dp,unit_str="angstrom")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="PBE_HOLE_T_C_LR",&
description="PBE exchange hole model in trucanted coulomb potential",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"SCALE_X",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"CUTOFF_RADIUS",&
description="Defines cutoff for lower integration boundary",&
- default_r_val=1.0_dp,unit_str="angstrom", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1.0_dp,unit_str="angstrom")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="GV09",&
description="Combination of three different exchange hole models",&
- n_keywords=0, n_subsections=0, repeats=.FALSE., &
- error=error)
+ n_keywords=0, n_subsections=0, repeats=.FALSE.)
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"SCALE_X",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"CUTOFF_RADIUS",&
description="Defines cutoff for lower integration boundary",&
- default_r_val=0.0_dp,unit_str="angstrom", error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_val=0.0_dp,unit_str="angstrom")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"GAMMA",&
description="Parameter for Becke Roussel hole",&
- default_r_val=1.0_dp, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1.0_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL section_create(subsection,name="BEEF",& !rk: BEEF Exchange
description="Uses the BEEFvdW exchange functional",&
n_keywords=0, n_subsections=0, repeats=.FALSE., &
- citations=(/Wellendorff2012/),&
- error=error)
+ citations=(/Wellendorff2012/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,"scale_x",&
description="scales the exchange part of the functional",&
- default_r_val=1._dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ default_r_val=1._dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
END SUBROUTINE create_xc_fun_section
! *****************************************************************************
@@ -746,12 +716,10 @@ END SUBROUTINE create_xc_fun_section
!> \param name ...
!> \param description ...
!> \param usage ...
-!> \param error ...
! *****************************************************************************
- SUBROUTINE create_libxc_section(section,name,description,usage,error)
+ SUBROUTINE create_libxc_section(section,name,description,usage)
TYPE(section_type), POINTER :: section
CHARACTER(len=*), INTENT(in) :: name, description, usage
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_libxc_section', &
routineP = moduleN//':'//routineN
@@ -761,48 +729,45 @@ SUBROUTINE create_libxc_section(section,name,description,usage,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
- CPPrecondition(name == "LIBXC" .OR. name == "KE_LIBXC",cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
+ CPPrecondition(name == "LIBXC" .OR. name == "KE_LIBXC",cp_failure_level,routineP,failure)
NULLIFY(keyword)
CALL section_create(section, name, description,&
n_keywords=3, n_subsections=0, repeats=.FALSE., &
- citations=(/Marques2012/), error=error)
+ citations=(/Marques2012/))
CALL keyword_create(keyword,"_SECTION_PARAMETERS_",&
description="activates the functional",&
- lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ lone_keyword_l_val=.TRUE.,default_l_val=.FALSE.)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="FUNCTIONAL",&
description="names of the functionals, see also "//&
"http://www.tddft.org/programs/octopus/wiki/index.php/Libxc_functionals ."//&
"The precise list of available functionals depends on "//&
"the version of libxc interfaced (currently 2.2.2).",&
- usage=usage,type_of_var=char_t,n_var=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage=usage,type_of_var=char_t,n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="SCALE",&
description="scaling factors of the functionals",&
usage="SCALE 1.0 1.0",type_of_var=real_t,&
- default_r_vals=(/1.0_dp/),n_var=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_r_vals=(/1.0_dp/),n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="PARAMETERS",&
description="parameters of the functionals",&
- type_of_var=real_t,default_r_vals=(/1e20_dp/),n_var=-1,error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ type_of_var=real_t,default_r_vals=(/1e20_dp/),n_var=-1)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE
! *****************************************************************************
!> \brief creates the structure of the section needed to select an xc potential
!> \param section the section that will be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author thomas chassaing
! *****************************************************************************
- SUBROUTINE create_xc_potential_section(section,error)
+ SUBROUTINE create_xc_potential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_xc_potential_section', &
routineP = moduleN//':'//routineN
@@ -813,37 +778,35 @@ SUBROUTINE create_xc_potential_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="xc_potential",&
description="The xc potential to use (CAREFUL: xc potential here refers "//&
"to potentials that are not derived from an xc functional, but rather are "//&
"modelled directly. Therefore there is no consistent xc energy available. "//&
"To still get an energy expression, see ENERGY below",&
- n_keywords=1, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.FALSE.)
NULLIFY(subsection,keyword)
CALL section_create(subsection,name="SAOP",&
description="Uses the SAOP potential",&
- n_keywords=3, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=3, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,name="ALPHA",&
description="Value of the alpha parameter (default = 1.19).",&
- usage="ALPHA 1.19", default_r_val=1.19_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="ALPHA 1.19", default_r_val=1.19_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="BETA",&
description="Value of the beta parameter (default = 0.01).",&
- usage="BETA 0.01", default_r_val=0.01_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ usage="BETA 0.01", default_r_val=0.01_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="K_RHO",&
description="Value of the K_rho parameter (default = 0.42).",&
- usage="ALPHA 0.42", default_r_val=0.42_dp,error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
- CALL section_add_subsection(section,subsection,error=error)
- CALL section_release(subsection,error=error)
+ usage="ALPHA 0.42", default_r_val=0.42_dp)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
+ CALL section_add_subsection(section,subsection)
+ CALL section_release(subsection)
CALL keyword_create(keyword, name="ENERGY",&
description="How to determine the total energy.",&
@@ -854,22 +817,19 @@ SUBROUTINE create_xc_potential_section(section,error)
xc_pot_energy_xc_functional,&
xc_pot_energy_sum_eigenvalues,&
xc_pot_energy_sum_eigenvalues /),&
- default_i_val=xc_pot_energy_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=xc_pot_energy_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
END SUBROUTINE create_xc_potential_section
! *****************************************************************************
!> \brief creates the structure of the section needed for vdW potentials
!> \param section the section that will be created
-!> \param error variable to control error logging, stopping,...
-!> see module cp_error_handling
!> \author jgh
! *****************************************************************************
- SUBROUTINE create_vdw_potential_section(section,error)
+ SUBROUTINE create_vdw_potential_section(section)
TYPE(section_type), POINTER :: section
- TYPE(cp_error_type), INTENT(inout) :: error
CHARACTER(len=*), PARAMETER :: routineN = 'create_vdw_potential_section', &
routineP = moduleN//':'//routineN
@@ -880,14 +840,13 @@ SUBROUTINE create_vdw_potential_section(section,error)
failure=.FALSE.
- CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,error,failure)
+ CPPrecondition(.NOT.ASSOCIATED(section),cp_failure_level,routineP,failure)
CALL section_create(section,name="vdw_potential",&
description="This section combines all possible additional dispersion "//&
"corrections to the normal XC functionals. This can be more functionals "//&
"or simple empirical pair potentials. ",&
citations=(/grimme2006,Tran2013/),&
- n_keywords=1, n_subsections=1, repeats=.FALSE., &
- error=error)
+ n_keywords=1, n_subsections=1, repeats=.FALSE.)
NULLIFY(subsection,keyword)
CALL keyword_create(keyword, name="POTENTIAL_TYPE",&
@@ -899,20 +858,19 @@ SUBROUTINE create_vdw_potential_section(section,error)
enum_desc=s2a("No dispersion/van der Waals functional",&
"Pair potential van der Waals density functional",&
"Nonlocal van der Waals density functional"),&
- default_i_val=xc_vdw_fun_none, error=error)
- CALL section_add_keyword(section,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=xc_vdw_fun_none)
+ CALL section_add_keyword(section,keyword)
+ CALL keyword_release(keyword)
CALL section_create(subsection,name="PAIR_POTENTIAL",&
description="Information on the pair potential to calculate dispersion",&
- n_keywords=5, n_subsections=0, repeats=.TRUE., &
- error=error)
+ n_keywords=5, n_subsections=0, repeats=.TRUE.)
CALL keyword_create(keyword,name="R_CUTOFF",&
description="Range of potential. The cutoff will be 2 times this value",&
usage="R_CUTOFF 24.0", default_r_val=20.0_dp,&
- unit_str="angstrom",error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ unit_str="angstrom")
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword,name="TYPE",&
description="Type of potential",&
citations=(/grimme2006,grimme2010,grimme2011/),&
@@ -922,121 +880,120 @@ SUBROUTINE create_vdw_potential_section(section,error)
enum_desc=s2a("Grimme D2 method",&
"Grimme D3 method (zero damping)",&
"Grimme D3 method (Becke-Johnson damping)"),&
- default_i_val=vdw_pairpot_dftd3, error=error)
- CALL section_add_keyword(subsection,keyword,error=error)
- CALL keyword_release(keyword,error=error)
+ default_i_val=vdw_pairpot_dftd3)
+ CALL section_add_keyword(subsection,keyword)
+ CALL keyword_release(keyword)
CALL keyword_create(keyword, name="PARAMETER_FILE_NAME",&
description="Name of the parameter file, may include a path",&
usage="PARAMETER_FILE_NAME |