ocaml-protoc.compiler-lib
Ocaml_protoc_compiler_lib.Pb_parsing_lexer
ocaml-protoc
module Loc = Pb_location
val resolve_identifier : Pb_location.t -> string -> Pb_parsing_parser.token
type comment =
| Comment_value of string
| Comment_eof
val comment_value : string -> comment
val comment_eof : comment
type string_ =
| String_value of string
| String_eof
val string_value : string -> string_
val string_eof : string_
val update_loc : Lexing.lexbuf -> unit
val __ocaml_lex_tables : Lexing.lex_tables
val lexer : Lexing.lexbuf -> Pb_parsing_parser.token
val __ocaml_lex_lexer_rec : Lexing.lexbuf -> int -> Pb_parsing_parser.token
val comment : string list -> Lexing.lexbuf -> comment
val __ocaml_lex_comment_rec : string list -> Lexing.lexbuf -> int -> comment
val multi_line_comment : string list -> Lexing.lexbuf -> comment
val __ocaml_lex_multi_line_comment_rec : string list -> Lexing.lexbuf -> int -> comment
val string : string list -> Lexing.lexbuf -> string_
val __ocaml_lex_string_rec : string list -> Lexing.lexbuf -> int -> string_