Added injectivity annots back (clash with GPR9781)

master
John Whitington 2020-07-23 19:08:46 +01:00
parent f32c4df6df
commit 1f2daa31d3
5 changed files with 9 additions and 9 deletions

View File

@ -314,7 +314,7 @@ module type HashedType =
module type S =
sig
type key
type 'a t
type !'a t
val create : int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit (** @since 4.00.0 *)
@ -390,7 +390,7 @@ module type SeededHashedType =
module type SeededS =
sig
type key
type 'a t
type !'a t
val create : ?random (* thwart tools/unlabel *) :bool -> int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit

View File

@ -67,7 +67,7 @@ module type S =
type key
(** The type of the map keys. *)
type (+'a) t
type (!+'a) t
(** The type of maps from type [key] to type ['a]. *)
val empty: 'a t

View File

@ -325,7 +325,7 @@ module type HashedType =
module type S =
sig
type key
type 'a t
type !'a t
val create : int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit (** @since 4.00.0 *)
@ -403,7 +403,7 @@ module type SeededHashedType =
module type SeededS =
sig
type key
type 'a t
type !'a t
val create : ?random (* thwart tools/unlabel *) :bool -> int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit
@ -555,7 +555,7 @@ module type S =
type key
(** The type of the map keys. *)
type (+'a) t
type (!+'a) t
(** The type of maps from type [key] to type ['a]. *)
val empty: 'a t

View File

@ -314,7 +314,7 @@ module type HashedType =
module type S =
sig
type key
type 'a t
type !'a t
val create : int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit (** @since 4.00.0 *)
@ -390,7 +390,7 @@ module type SeededHashedType =
module type SeededS =
sig
type key
type 'a t
type !'a t
val create : ?random (* thwart tools/unlabel *) :bool -> int -> 'a t
val clear : 'a t -> unit
val reset : 'a t -> unit

View File

@ -67,7 +67,7 @@ module type S =
type key
(** The type of the map keys. *)
type (+'a) t
type (!+'a) t
(** The type of maps from type [key] to type ['a]. *)
val empty: 'a t