summaryrefslogtreecommitdiffstats
path: root/stdlib/set.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/set.mli')
-rw-r--r--stdlib/set.mli1
1 files changed, 1 insertions, 0 deletions
diff --git a/stdlib/set.mli b/stdlib/set.mli
index 4cf37425a..dff78105a 100644
--- a/stdlib/set.mli
+++ b/stdlib/set.mli
@@ -23,6 +23,7 @@ module type S =
val iter: (elt -> 'a) -> t -> unit
val fold: (elt -> 'a -> 'a) -> t -> 'a -> 'a
val elements: t -> elt list
+ val choose: t -> elt
end
module Make(Ord: OrderedType): (S with elt = Ord.t)