parsley-core-1.1.0.0: A fast parser combinator library backed by Typed Template Haskell
LicenseBSD-3-Clause
MaintainerJamie Willis
Stabilityunstable
Safe HaskellNone
LanguageHaskell2010

Parsley.Internal.Backend.Machine

Description

Since: 0.1.0.0

Documentation

class (InputPrep input, Ops input) => Input input Source #

Instances

Instances details
Input ByteString Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input ByteString Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input Text Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input Stream Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input CharList Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input Text16 Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input [Char] Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

Input (UArray Int Char) Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine

eval :: forall input a. (Input input, Trace) => Code input -> (LetBinding input a a, DMap MVar (LetBinding input a)) -> Code (Maybe a) Source #

class PositionOps input Source #

Minimal complete definition

same, shiftRight

Instances

Instances details
PositionOps ByteString Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind ByteString)). rep ~ Rep ByteString => Proxy ByteString -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind ByteString)). rep ~ Rep ByteString => Proxy ByteString -> Code rep -> Code Int# -> Code rep Source #

PositionOps ByteString Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind ByteString)). rep ~ Rep ByteString => Proxy ByteString -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind ByteString)). rep ~ Rep ByteString => Proxy ByteString -> Code rep -> Code Int# -> Code rep Source #

PositionOps Text Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind Text)). rep ~ Rep Text => Proxy Text -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind Text)). rep ~ Rep Text => Proxy Text -> Code rep -> Code Int# -> Code rep Source #

PositionOps Stream Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind Stream)). rep ~ Rep Stream => Proxy Stream -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind Stream)). rep ~ Rep Stream => Proxy Stream -> Code rep -> Code Int# -> Code rep Source #

PositionOps CharList Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind CharList)). rep ~ Rep CharList => Proxy CharList -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind CharList)). rep ~ Rep CharList => Proxy CharList -> Code rep -> Code Int# -> Code rep Source #

PositionOps Text16 Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind Text16)). rep ~ Rep Text16 => Proxy Text16 -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind Text16)). rep ~ Rep Text16 => Proxy Text16 -> Code rep -> Code Int# -> Code rep Source #

PositionOps [Char] Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind [Char])). rep ~ Rep [Char] => Proxy [Char] -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind [Char])). rep ~ Rep [Char] => Proxy [Char] -> Code rep -> Code Int# -> Code rep Source #

PositionOps (UArray Int Char) Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.InputOps

Methods

same :: forall (rep :: TYPE (RepKind (UArray Int Char))). rep ~ Rep (UArray Int Char) => Proxy (UArray Int Char) -> Code rep -> Code rep -> Code Bool Source #

shiftRight :: forall (rep :: TYPE (RepKind (UArray Int Char))). rep ~ Rep (UArray Int Char) => Proxy (UArray Int Char) -> Code rep -> Code Int# -> Code rep Source #

data Defunc a where Source #

Constructors

SAME :: PositionOps o => Defunc (o -> o -> Bool) 

Instances

Instances details
Show (Defunc a) Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.Defunc

Methods

showsPrec :: Int -> Defunc a -> ShowS #

show :: Defunc a -> String #

showList :: [Defunc a] -> ShowS #

data LetBinding o a x Source #

Instances

Instances details
Show (LetBinding o a x) Source # 
Instance details

Defined in Parsley.Internal.Backend.Machine.LetBindings

Methods

showsPrec :: Int -> LetBinding o a x -> ShowS #

show :: LetBinding o a x -> String #

showList :: [LetBinding o a x] -> ShowS #