symparsec-1.1.1: Type level string parser combinators
Safe HaskellSafe-Inferred
LanguageGHC2021

Symparsec.Parser.End

Synopsis

Documentation

type End = 'PParser EndChSym (Con1 Right) '() Source #

Assert end of symbol, or fail.

data EndChSym f Source #

Instances

Instances details
SingParser End Source # 
Instance details

Defined in Symparsec.Parser.End

Associated Types

type PS End :: s -> Type Source #

type PR End :: r -> Type Source #

type PR End Source # 
Instance details

Defined in Symparsec.Parser.End

type PR End = SUnit
type PS End Source # 
Instance details

Defined in Symparsec.Parser.End

type PS End = SUnit
type App (EndChSym :: FunKind Char (s ~> PResult s r) -> Type) (f :: Char) Source # 
Instance details

Defined in Symparsec.Parser.End

type App (EndChSym :: FunKind Char (s ~> PResult s r) -> Type) (f :: Char) = EndChSym1 f :: FunKind s (PResult s r) -> Type

data EndChSym1 ch s Source #

Instances

Instances details
type App (EndChSym1 ch :: FunKind a (PResult a r) -> Type) (s :: a) Source # 
Instance details

Defined in Symparsec.Parser.End

type App (EndChSym1 ch :: FunKind a (PResult a r) -> Type) (s :: a) = 'Err ('EBase "End" ('Text "expected end of string")) :: Result Symbol a r