dict_i4tuple_callstat_set Subroutine

private subroutine dict_i4tuple_callstat_set(dict, key, value)

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

Arguments

Type IntentOptional Attributes Name
type(dict_i4tuple_callstat_type), intent(inout) :: dict
integer(kind=int_4), intent(in), dimension(2) :: key
type(call_stat_type), intent(in), POINTER :: value

Source Code

      SUBROUTINE dict_i4tuple_callstat_set(dict, key, value)
      !! Stores, and possibly overwrites, a given value under a given key.
         TYPE(dict_i4tuple_callstat_type), intent(inout)  :: dict
         INTEGER(kind=int_4), dimension(2), intent(in)                          :: key
         TYPE(call_stat_type), POINTER, intent(in)                          :: value
         INTEGER(KIND=int_8)                                   :: hash
         IF (.not. ASSOCIATED(dict%buckets)) &
            DBCSR_ABORT("dict_i4tuple_callstat_set: dictionary is not initialized.")

         hash = hash_i4tuple (key)
         call set_hashed_i4tuple_callstat (dict, key, value, hash)
      END SUBROUTINE dict_i4tuple_callstat_set