symbol-parser-0.3.0: Type level string parser combinators
Safe HaskellSafe-Inferred
LanguageGHC2021

Data.Type.Symbol.Parser.Common

Synopsis

Documentation

data FailChSym name e f Source #

Instances

Instances details
type App (FailChSym name e :: FunKind Char (s ~> Result s r) -> Type) (f :: Char) Source # 
Instance details

Defined in Data.Type.Symbol.Parser.Common

type App (FailChSym name e :: FunKind Char (s ~> Result s r) -> Type) (f :: Char)

data FailEndSym name e s Source #

Instances

Instances details
type App (FailEndSym name e :: FunKind a (Either E r) -> Type) (s :: a) Source # 
Instance details

Defined in Data.Type.Symbol.Parser.Common

type App (FailEndSym name e :: FunKind a (Either E r) -> Type) (s :: a) = 'Left ('EBase name e) :: Either E r

data EmitEndSym r Source #

Emit state directly on end of input.

Instances

Instances details
type App (EmitEndSym :: FunKind b (Either E b) -> Type) (r :: b) Source # 
Instance details

Defined in Data.Type.Symbol.Parser.Common

type App (EmitEndSym :: FunKind b (Either E b) -> Type) (r :: b) = 'Right r :: Either E b

type ErrParserLimitation msg = Text "parser limitation: " :<>: Text msg Source #