diff options
Diffstat (limited to 'stdlib/parsing.mli')
-rw-r--r-- | stdlib/parsing.mli | 6 |
1 files changed, 4 insertions, 2 deletions
diff --git a/stdlib/parsing.mli b/stdlib/parsing.mli index 99e891ce1..c1c1fedad 100644 --- a/stdlib/parsing.mli +++ b/stdlib/parsing.mli @@ -44,11 +44,13 @@ type parse_tables = gindex : string; tablesize : int; table : string; - check : string } + check : string; + error_function : string -> unit } exception YYexit of Obj.t val yyparse : parse_tables -> int -> (Lexing.lexbuf -> 'a) -> Lexing.lexbuf -> 'b val peek_val : parser_env -> int -> 'a -val is_current_lookahead: 'a -> bool +val is_current_lookahead : 'a -> bool +val parse_error : string -> unit |