diff options
Diffstat (limited to 'stdlib/weak.ml')
-rw-r--r-- | stdlib/weak.ml | 4 |
1 files changed, 2 insertions, 2 deletions
diff --git a/stdlib/weak.ml b/stdlib/weak.ml index 536a42e04..8166142b6 100644 --- a/stdlib/weak.ml +++ b/stdlib/weak.ml @@ -80,8 +80,8 @@ module Make (H : Hashtbl.HashedType) : (S with type data = H.t) = struct let sz = if sz < 7 then 7 else sz in let sz = if sz > Sys.max_array_length then Sys.max_array_length else sz in { - table = Array.create sz emptybucket; - hashes = Array.create sz [| |]; + table = Array.make sz emptybucket; + hashes = Array.make sz [| |]; limit = limit; oversize = 0; rover = 0; |