symparsec
Safe HaskellNone
LanguageGHC2021

Symparsec.Parser.Functor

Description

Type-level string parsers shaped like Functor functions.

Synopsis

Documentation

data ((f :: a ~> b) <$> (p :: PParser a)) (s :: FunKind PState (PReply b)) infixl 4 Source #

<$> for parsers. Apply the given type function to the result.

Instances

Instances details
type App (f <$> p :: FunKind PState (PReply a2) -> Type) (s :: PState) Source # 
Instance details

Defined in Symparsec.Parser.Functor

type App (f <$> p :: FunKind PState (PReply a2) -> Type) (s :: PState)

type (<$) (a1 :: a) (p :: PParser b) = (ConstSym1 a1 :: FunKind b a -> Type) <$> p infixl 4 Source #

<$ for parsers. Replace the parser result with the given value.

type ($>) (p :: PParser a) (a1 :: b) = (ConstSym1 a1 :: FunKind a b -> Type) <$> p infixl 4 Source #

$> for parsers. Flipped <$.