ptera-th-0.1.0.0: A parser generator
Safe HaskellNone
LanguageHaskell2010

Language.Parser.Ptera.TH.Syntax

Synopsis

Documentation

type T ctx = GrammarM ctx Source #

class HasField (x :: k) r a | x r -> a where #

Constraint representing the fact that the field x belongs to the record type r and has field type a. This will be solved automatically, but manual instances may be provided as well.

Methods

getField :: r -> a #

Selector function to extract the field from the record.

class (KnownSymbol v, HasField v rules (RuleExprType rules (RuleExprReturnType rules v))) => HasRuleExprField rules (v :: Symbol) where #

Minimal complete definition

Nothing

Associated Types

type RuleExprReturnType rules (v :: Symbol) #

Methods

nonTerminalName :: rules -> proxy v -> String #

type family TokensTag tokens :: [Symbol] #

type family RulesTag rules :: [Symbol] #

type family RuleExprType rules :: Type -> Type #

type GrammarM ctx = Grammar (SemActM ctx) Source #

class MemberInitials rules (initials :: [Symbol]) where #

Methods

memberInitials :: T (DictF (HasRuleExprField rules)) initials #

class Rules rules where #

Methods

generateRules :: T (DictF (HasRuleExprField rules)) (RulesTag rules) #

class GrammarToken tokens elem where #

Methods

tokenToTerminal :: Proxy tokens -> elem -> T (TokensTag tokens) #

type RuleExprM ctx = RuleExpr (SemActM ctx) Source #

type AltM ctx = Alt (SemActM ctx) Source #

data Expr rules tokens elem (us :: [Type]) #

newtype SemActM ctx us a Source #

Constructors

UnsafeSemActM 

semActM :: (HTExpList us -> Q (TExp (ActionTask ctx a))) -> T f us -> SemActM ctx us a Source #

data HFList (a :: k -> Type) (b :: [k]) where #

Constructors

HFNil :: forall k (a :: k -> Type). HFList a ('[] :: [k]) 
HFCons :: forall k (a :: k -> Type) (x :: k) (xs :: [k]). a x -> HFList a xs -> HFList a (x ': xs) 

data DictF (a :: k -> Constraint) (b :: k) where #

Constructors

DictF :: forall k (a :: k -> Constraint) (b :: k). a b => DictF a b 

pattern HNil :: HTExpList '[] Source #

pattern (:*) :: Q (TExp u) -> HTExpList us -> HTExpList (u ': us) infixr 6 Source #

newtype TExpQ a Source #

Constructors

TExpQ 

Fields

newtype ActionTask ctx a #

Constructors

ActionTask 

Fields

Instances

Instances details
Monad (ActionTask ctx) 
Instance details

Defined in Language.Parser.Ptera.Syntax

Methods

(>>=) :: ActionTask ctx a -> (a -> ActionTask ctx b) -> ActionTask ctx b #

(>>) :: ActionTask ctx a -> ActionTask ctx b -> ActionTask ctx b #

return :: a -> ActionTask ctx a #

Functor (ActionTask ctx) 
Instance details

Defined in Language.Parser.Ptera.Syntax

Methods

fmap :: (a -> b) -> ActionTask ctx a -> ActionTask ctx b #

(<$) :: a -> ActionTask ctx b -> ActionTask ctx a #

Applicative (ActionTask ctx) 
Instance details

Defined in Language.Parser.Ptera.Syntax

Methods

pure :: a -> ActionTask ctx a #

(<*>) :: ActionTask ctx (a -> b) -> ActionTask ctx a -> ActionTask ctx b #

liftA2 :: (a -> b -> c) -> ActionTask ctx a -> ActionTask ctx b -> ActionTask ctx c #

(*>) :: ActionTask ctx a -> ActionTask ctx b -> ActionTask ctx b #

(<*) :: ActionTask ctx a -> ActionTask ctx b -> ActionTask ctx a #

data ActionTaskResult ctx a #

Instances

Instances details
Functor (ActionTaskResult ctx) 
Instance details

Defined in Language.Parser.Ptera.Syntax

Methods

fmap :: (a -> b) -> ActionTaskResult ctx a -> ActionTaskResult ctx b #

(<$) :: a -> ActionTaskResult ctx b -> ActionTaskResult ctx a #

(Eq a, Eq ctx) => Eq (ActionTaskResult ctx a) 
Instance details

Defined in Language.Parser.Ptera.Syntax

Methods

(==) :: ActionTaskResult ctx a -> ActionTaskResult ctx a -> Bool #

(/=) :: ActionTaskResult ctx a -> ActionTaskResult ctx a -> Bool #

(Show a, Show ctx) => Show (ActionTaskResult ctx a) 
Instance details

Defined in Language.Parser.Ptera.Syntax

modifyAction :: (ctx -> ctx) -> ActionTask ctx () #

type Alt = AltM () Source #

semAct :: (HTExpList us -> Q (TExp a)) -> T f us -> SemActM ctx us a Source #

fixGrammar :: forall (initials :: [Symbol]) (action :: [Type] -> Type -> Type) rules tokens elem. (MemberInitials rules initials, Rules rules, RuleExprType rules ~ RuleExpr action rules tokens elem) => rules -> Grammar action rules tokens elem initials #

ruleExpr :: forall (action :: [Type] -> Type -> Type) rules tokens elem a. [Alt action rules tokens elem a] -> RuleExpr action rules tokens elem a #

(<^>) :: forall rules tokens elem (us1 :: [Type]) (us2 :: [Type]). Expr rules tokens elem us1 -> Expr rules tokens elem us2 -> Expr rules tokens elem (Concat us1 us2) infixr 5 #

(<:>) :: Expr rules tokens elem us -> (HTExpList us -> Q (TExp a)) -> AltM ctx rules tokens elem a infixl 4 Source #

eps :: (HTExpList '[] -> Q (TExp a)) -> AltM ctx rules tokens elem a Source #

(<::>) :: Expr rules tokens elem us -> (HTExpList us -> Q (TExp (ActionTask ctx a))) -> AltM ctx rules tokens elem a infixl 4 Source #

epsM :: (HTExpList '[] -> Q (TExp (ActionTask ctx a))) -> AltM ctx rules tokens elem a Source #

var :: forall (v :: Symbol) proxy rules tokens elem. KnownSymbol v => proxy v -> Expr rules tokens elem '[RuleExprReturnType rules v] #

varA :: forall (v :: Symbol) rules tokens elem. KnownSymbol v => Expr rules tokens elem '[RuleExprReturnType rules v] #

tok :: forall tokens (t :: Symbol) rules elem. Membership (TokensTag tokens) t -> Expr rules tokens elem '[elem] #

class TokensMember tokens (t :: Symbol) where #

Methods

tokensMembership :: Proxy# '(tokens, t) -> Membership (TokensTag tokens) t #

tokA :: forall (t :: Symbol) rules tokens elem. TokensMember tokens t => Expr rules tokens elem '[elem] #