Better indentation for moreLabels.mli patches

master
John Whitington 2020-07-31 12:38:45 +01:00
parent 0e2a4a6ea7
commit 35a3470a9d
5 changed files with 24 additions and 24 deletions

View File

@ -384,9 +384,9 @@ module type S =
end
(** The output signature of the functor {!Make}. *)
module Make : functor (H : HashedType) -> S
with type key = H.t
and type 'a t = 'a Hashtbl.Make(H).t
module Make : functor (H : HashedType) -> S
with type key = H.t
and type 'a t = 'a Hashtbl.Make(H).t
(** Functor building an implementation of the hashtable structure.
The functor [Hashtbl.Make] returns a structure containing
a type [key] of keys and a type ['a t] of hash tables
@ -461,9 +461,9 @@ module type SeededS =
(** The output signature of the functor {!MakeSeeded}.
@since 4.00.0 *)
module MakeSeeded (H : SeededHashedType) : SeededS
with type key = H.t
and type 'a t = 'a Hashtbl.MakeSeeded(H).t
module MakeSeeded (H : SeededHashedType) : SeededS
with type key = H.t
and type 'a t = 'a Hashtbl.MakeSeeded(H).t
(** Functor building an implementation of the hashtable structure.
The functor [Hashtbl.MakeSeeded] returns a structure containing
a type [key] of keys and a type ['a t] of hash tables
@ -858,9 +858,9 @@ module type S =
end
(** Output signature of the functor {!Make}. *)
module Make : functor (Ord : OrderedType) -> S
with type key = Ord.t
and type 'a t = 'a Map.Make(Ord).t
module Make : functor (Ord : OrderedType) -> S
with type key = Ord.t
and type 'a t = 'a Map.Make(Ord).t
(** Functor building an implementation of the map structure
given a totally ordered type. *)
@ -1159,9 +1159,9 @@ module type S =
end
(** Output signature of the functor {!Make}. *)
module Make : functor (Ord : OrderedType) -> S
with type elt = Ord.t
and type t = Set.Make(Ord).t
module Make : functor (Ord : OrderedType) -> S
with type elt = Ord.t
and type t = Set.Make(Ord).t
(** Functor building an implementation of the set structure
given a totally ordered type. *)

View File

@ -1,3 +1,3 @@
module Make : functor (H : HashedType) -> S
with type key = H.t
and type 'a t = 'a Hashtbl.Make(H).t
module Make : functor (H : HashedType) -> S
with type key = H.t
and type 'a t = 'a Hashtbl.Make(H).t

View File

@ -1,3 +1,3 @@
module MakeSeeded (H : SeededHashedType) : SeededS
with type key = H.t
and type 'a t = 'a Hashtbl.MakeSeeded(H).t
module MakeSeeded (H : SeededHashedType) : SeededS
with type key = H.t
and type 'a t = 'a Hashtbl.MakeSeeded(H).t

View File

@ -1,3 +1,3 @@
module Make : functor (Ord : OrderedType) -> S
with type key = Ord.t
and type 'a t = 'a Map.Make(Ord).t
module Make : functor (Ord : OrderedType) -> S
with type key = Ord.t
and type 'a t = 'a Map.Make(Ord).t

View File

@ -1,3 +1,3 @@
module Make : functor (Ord : OrderedType) -> S
with type elt = Ord.t
and type t = Set.Make(Ord).t
module Make : functor (Ord : OrderedType) -> S
with type elt = Ord.t
and type t = Set.Make(Ord).t