summaryrefslogtreecommitdiffstats
path: root/stdlib/set.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/set.mli')
-rw-r--r--stdlib/set.mli4
1 files changed, 4 insertions, 0 deletions
diff --git a/stdlib/set.mli b/stdlib/set.mli
index 22bb455a8..a7ee6b6cd 100644
--- a/stdlib/set.mli
+++ b/stdlib/set.mli
@@ -143,6 +143,10 @@ module type S =
strictly greater than [x];
[present] is [false] if [s] contains no element equal to [x],
or [true] if [s] contains an element equal to [x]. *)
+
+ val find: elt -> t -> elt
+ (** [find x s] returns the element of [s] equal to [x], or raise
+ [Not_found] if no such element exists. *)
end
(** Output signature of the functor {!Set.Make}. *)