diff options
Diffstat (limited to 'stdlib/set.ml')
-rw-r--r-- | stdlib/set.ml | 2 |
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/set.ml b/stdlib/set.ml index e7aa9d643..140b7ff47 100644 --- a/stdlib/set.ml +++ b/stdlib/set.ml @@ -40,7 +40,7 @@ module type S = val choose: t -> elt end -module Make(Ord: OrderedType): (S with elt = Ord.t) = +module Make(Ord: OrderedType) = struct type elt = Ord.t type t = Empty | Node of t * elt * t * int |