Skip to content

Commit 2f4d48e

Browse files
committed
stdlib_hash_64bit
1 parent 95acdca commit 2f4d48e

File tree

1 file changed

+8
-8
lines changed

1 file changed

+8
-8
lines changed

src/stdlib_hash_64bit.fypp

Lines changed: 8 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -208,7 +208,7 @@ interface
208208
module subroutine new_spooky_hash_seed( seed )
209209
!! Version: experimental
210210
!!
211-
!! Random SEED generator for
211+
!! Random seed generator for SPOOKY_HASH
212212
integer(int64), intent(inout) :: seed(2)
213213
end subroutine new_spooky_hash_seed
214214

@@ -243,7 +243,7 @@ interface
243243
module subroutine new_pengy_hash_seed( seed )
244244
!! Version: experimental
245245
!!
246-
!! Random SEED generator for MIR_HASH_STRICT
246+
!! Random seed generator for MIR_HASH_STRICT
247247
integer(int32), intent(inout) :: seed
248248
end subroutine new_pengy_hash_seed
249249

@@ -254,8 +254,8 @@ contains
254254
elemental function fibonacci_hash( key, nbits ) result( sample )
255255
!! Version: experimental
256256
!!
257-
!! Maps the 64 bit integer KEY to an unsigned integer value with only NBITS
258-
!! bits where NBITS is less than 64
257+
!! Maps the 64 bit integer `key` to an unsigned integer value with only `nbits`
258+
!! bits where `nbits` is less than 64
259259
!! ([Specification](../page/specs/stdlib_hash_procedures.html#fibonacci_hash-maps-an-integer-to-a-smaller-number-of-bits_1))
260260

261261
integer(int64), intent(in) :: key
@@ -269,8 +269,8 @@ contains
269269
elemental function universal_mult_hash( key, seed, nbits ) result( sample )
270270
!! Version: experimental
271271
!!
272-
!! Uses the "random" odd 64 bit integer SEED to map the 64 bit integer KEY to
273-
!! an unsigned integer value with only NBITS bits where NBITS is less than 64.
272+
!! Uses the "random" odd 64 bit integer `seed` to map the 64 bit integer `key` to
273+
!! an unsigned integer value with only `nbits` bits where `nbits` is less than 64.
274274
!! ([Specification](../page/specs/stdlib_hash_procedures.html#universal_mult_hash-maps-an-integer-to-a-smaller-number-of-bits_1))
275275

276276
integer(int64), intent(in) :: key
@@ -285,7 +285,7 @@ contains
285285
subroutine odd_random_integer( harvest )
286286
!! Version: experimental
287287
!!
288-
!! Returns a 64 bit pseudo random integer, HARVEST, distributed uniformly over
288+
!! Returns a 64 bit pseudo random integer, `harvest`, distributed uniformly over
289289
!! the odd integers of the 64 bit kind.
290290
!! ([Specification](../page/specs/stdlib_hash_procedures.html#odd_random_integer-returns-odd-integer))
291291

@@ -303,7 +303,7 @@ contains
303303
subroutine random_integer( harvest )
304304
!! Version: experimental
305305
!!
306-
!! Returns a 64 bit pseudo random integer, HARVEST, distributed uniformly over
306+
!! Returns a 64 bit pseudo random integer, `harvest`, distributed uniformly over
307307
!! the values of the 64 bit kind.
308308
integer(int64), intent(out) :: harvest
309309
real(dp) :: sample(2)

0 commit comments

Comments
 (0)