Module InspectionTableInterpreter.Make
Parameters
TT : TableFormat.TABLES
IT : InspectionTableFormat.TABLES with type 'a lr1state = int
ET : EngineTypes.TABLE with type terminal = int and type nonterminal = int and type semantic_value = Stdlib.Obj.t
E : sig ... end
Signature
include IncrementalEngine.SYMBOLS
type 'a lr1state
type production
type item
= production * int
val compare_terminals : _ terminal -> _ terminal -> int
val compare_nonterminals : _ nonterminal -> _ nonterminal -> int
val compare_symbols : xsymbol -> xsymbol -> int
val compare_productions : production -> production -> int
val compare_items : item -> item -> int
val incoming_symbol : 'a lr1state -> 'a symbol
val items : _ lr1state -> item list
val lhs : production -> xsymbol
val rhs : production -> xsymbol list
val nullable : _ nonterminal -> bool
val first : _ nonterminal -> _ terminal -> bool
val xfirst : xsymbol -> _ terminal -> bool
val foreach_terminal : (xsymbol -> 'a -> 'a) -> 'a -> 'a
val foreach_terminal_but_error : (xsymbol -> 'a -> 'a) -> 'a -> 'a
val feed : 'a symbol -> IncrementalEngine.position -> 'a -> IncrementalEngine.position -> 'b env -> 'b env