summaryrefslogtreecommitdiffstats
path: root/stdlib/parsing.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/parsing.ml')
-rw-r--r--stdlib/parsing.ml4
1 files changed, 2 insertions, 2 deletions
diff --git a/stdlib/parsing.ml b/stdlib/parsing.ml
index 96eaa5da3..87270e846 100644
--- a/stdlib/parsing.ml
+++ b/stdlib/parsing.ml
@@ -114,7 +114,7 @@ let clear_parser() =
Array.fill env.v_stack 0 env.stacksize (Obj.repr ());
env.lval <- Obj.repr ()
-let current_lookahead_fun = ref (fun (x: Obj.t) -> false)
+let current_lookahead_fun = ref (fun (x : Obj.t) -> false)
let yyparse tables start lexer lexbuf =
let rec loop cmd arg =
@@ -187,4 +187,4 @@ let rhs_end n =
let is_current_lookahead tok =
(!current_lookahead_fun)(Obj.repr tok)
-let parse_error (msg: string) = ()
+let parse_error (msg : string) = ()