summaryrefslogtreecommitdiffstats
path: root/stdlib/stack.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/stack.mli')
-rw-r--r--stdlib/stack.mli2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/stack.mli b/stdlib/stack.mli
index 38e42a623..7815657c7 100644
--- a/stdlib/stack.mli
+++ b/stdlib/stack.mli
@@ -33,7 +33,7 @@ val clear : 'a t -> unit
(* Discard all elements from a stack. *)
val length: 'a t -> int
(* Return the number of elements in a stack. *)
-val iter: ('a -> unit) -> 'a t -> unit
+val iter: fun:('a -> unit) -> 'a t -> unit
(* [iter f s] applies [f] in turn to all elements of [s],
from the element at the top of the stack to the element at the
bottom of the stack. The stack itself is unchanged. *)