summaryrefslogtreecommitdiffstats
path: root/stdlib/stack.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/stack.mli')
-rw-r--r--stdlib/stack.mli4
1 files changed, 2 insertions, 2 deletions
diff --git a/stdlib/stack.mli b/stdlib/stack.mli
index e46288a63..ccb40797d 100644
--- a/stdlib/stack.mli
+++ b/stdlib/stack.mli
@@ -32,11 +32,11 @@ val pop: 'a t -> 'a
val top: 'a t -> 'a
(* [top s] returns the topmost element in stack [s],
or raises [Empty] if the stack is empty. *)
-val clear : 'a t -> unit
+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: f:('a -> unit) -> 'a t -> unit
+val iter: ('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. *)