summaryrefslogtreecommitdiffstats
path: root/stdlib/parsing.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/parsing.mli')
-rw-r--r--stdlib/parsing.mli8
1 files changed, 5 insertions, 3 deletions
diff --git a/stdlib/parsing.mli b/stdlib/parsing.mli
index c1c1fedad..62201b2c9 100644
--- a/stdlib/parsing.mli
+++ b/stdlib/parsing.mli
@@ -1,4 +1,4 @@
-(* The run-time library for parsers generated by camlyacc *)
+(* Module [Parsing]: the run-time library for parsers generated by [camlyacc]*)
val symbol_start : unit -> int
val symbol_end : unit -> int
@@ -10,7 +10,7 @@ val symbol_end : unit -> int
in a file is at position 0. *)
val rhs_start: int -> int
val rhs_end: int -> int
- (* Same as [symbol_start] and [symbol_end] above, but return then
+ (* Same as [symbol_start] and [symbol_end], but return then
position of the string matching the [n]th item on the
right-hand side of the rule, where [n] is the integer parameter
to [lhs_start] and [lhs_end]. [n] is 1 for the leftmost item. *)
@@ -22,7 +22,9 @@ val clear_parser : unit -> unit
programs. *)
exception Parse_error
- (* Raised when a parser encounters a syntax error. *)
+ (* Raised when a parser encounters a syntax error.
+ Can also be raised from the action part of a grammar rule,
+ to initiate error recovery. *)
(*--*)