summaryrefslogtreecommitdiffstats
path: root/stdlib/stack.mli
diff options
context:
space:
mode:
authorJacques Garrigue <garrigue at math.nagoya-u.ac.jp>2000-04-03 01:57:52 +0000
committerJacques Garrigue <garrigue at math.nagoya-u.ac.jp>2000-04-03 01:57:52 +0000
commit19fede7478c59780e990b196333bd4d33ce44ace (patch)
treed5d98bbbad6d9451404688bbe06e365c517a7428 /stdlib/stack.mli
parentf5887684a7354795875dc9bf6a8fdaddea0c90c5 (diff)
passage aux labels legers
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@3024 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
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 7815657c7..b90d56871 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: fun:('a -> unit) -> 'a t -> unit
+val iter: f:('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. *)