dict_str_i4_set Subroutine

private subroutine dict_str_i4_set(dict, key, value)

Stores, and possibly overwrites, a given value under a given key.

Arguments

Type IntentOptional Attributes Name
type(dict_str_i4_type), intent(inout) :: dict
character(len=default_string_length), intent(in) :: key
integer(kind=int_4), intent(in) :: value

Source Code

      SUBROUTINE dict_str_i4_set(dict, key, value)
      !! Stores, and possibly overwrites, a given value under a given key.
         TYPE(dict_str_i4_type), intent(inout)  :: dict
         CHARACTER(LEN=default_string_length), intent(in)                          :: key
         INTEGER(kind=int_4), intent(in)                          :: value
         INTEGER(KIND=int_8)                                   :: hash
         IF (.not. ASSOCIATED(dict%buckets)) &
            DBCSR_ABORT("dict_str_i4_set: dictionary is not initialized.")

         hash = hash_str (key)
         call set_hashed_str_i4 (dict, key, value, hash)
      END SUBROUTINE dict_str_i4_set