diff options
Diffstat (limited to 'stdlib/moreLabels.mli')
-rw-r--r-- | stdlib/moreLabels.mli | 1 |
1 files changed, 1 insertions, 0 deletions
diff --git a/stdlib/moreLabels.mli b/stdlib/moreLabels.mli index 5037ce484..bc15cb4bf 100644 --- a/stdlib/moreLabels.mli +++ b/stdlib/moreLabels.mli @@ -159,6 +159,7 @@ module Set : sig val max_elt : t -> elt val choose : t -> elt val split: elt -> t -> t * bool * t + val find: elt -> t -> elt end module Make : functor (Ord : OrderedType) -> S with type elt = Ord.t end |