summaryrefslogtreecommitdiffstats
path: root/stdlib/queue.mli
diff options
context:
space:
mode:
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. *)