summaryrefslogtreecommitdiffstats
path: root/stdlib/queue.mli
diff options
context:
space:
mode:
authorXavier Leroy <xavier.leroy@inria.fr>1995-08-09 13:15:01 +0000
committerXavier Leroy <xavier.leroy@inria.fr>1995-08-09 13:15:01 +0000
commitd0012c733a00d8d0bb3195ac59e965192660eec2 (patch)
tree5a31e9dc58e792d8e39f35da37d5a0f9b9ed4bc0 /stdlib/queue.mli
parentd2e588b4f03ebb1f387460b9ad8c028857c2586c (diff)
MAJ des commentaires de doc dans les interfaces
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@190 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/queue.mli')
-rw-r--r--stdlib/queue.mli6
1 files changed, 3 insertions, 3 deletions
diff --git a/stdlib/queue.mli b/stdlib/queue.mli
index 297e81afa..45fcb2c1e 100644
--- a/stdlib/queue.mli
+++ b/stdlib/queue.mli
@@ -1,4 +1,4 @@
-(* Queues *)
+(* Module [Queues]: queues *)
(* This module implements queues (FIFOs), with in-place modification. *)
@@ -23,6 +23,6 @@ val clear : 'a t -> unit
val length: 'a t -> int
(* Return the number of elements in a queue. *)
val iter: ('a -> 'b) -> 'a t -> unit
- (* [iter f q] applies [f] in turn to all elements of [q], from the
- least recently entered to the most recently entered.
+ (* [Queue.iter f q] applies [f] in turn to all elements of [q],
+ from the least recently entered to the most recently entered.
The queue itself is unchanged. *)