phino-0.0.0.17: Command-Line Manipulator of 𝜑-Calculus Expressions
Safe HaskellSafe-Inferred
LanguageHaskell2010

Ast

Documentation

newtype Program Source #

Constructors

Program Expression 

Instances

Instances details
Show Program Source # 
Instance details

Defined in Ast

Eq Program Source # 
Instance details

Defined in Ast

Methods

(==) :: Program -> Program -> Bool #

(/=) :: Program -> Program -> Bool #

data Expression Source #

Instances

Instances details
FromJSON Expression Source # 
Instance details

Defined in Yaml

Generic Expression Source # 
Instance details

Defined in Ast

Associated Types

type Rep Expression 
Instance details

Defined in Ast

Show Expression Source # 
Instance details

Defined in Ast

Eq Expression Source # 
Instance details

Defined in Ast

type Rep Expression Source # 
Instance details

Defined in Ast

data Binding Source #

Instances

Instances details
FromJSON Binding Source # 
Instance details

Defined in Yaml

Generic Binding Source # 
Instance details

Defined in Ast

Methods

from :: Binding -> Rep Binding x #

to :: Rep Binding x -> Binding #

Show Binding Source # 
Instance details

Defined in Ast

Eq Binding Source # 
Instance details

Defined in Ast

Methods

(==) :: Binding -> Binding -> Bool #

(/=) :: Binding -> Binding -> Bool #

type Rep Binding Source # 
Instance details

Defined in Ast

data Attribute Source #

Instances

Instances details
FromJSON Attribute Source # 
Instance details

Defined in Yaml

Generic Attribute Source # 
Instance details

Defined in Ast

Associated Types

type Rep Attribute 
Instance details

Defined in Ast

type Rep Attribute = D1 ('MetaData "Attribute" "Ast" "phino-0.0.0.17-2b1tbfUUh36B5bHKuQ8jM7" 'False) ((C1 ('MetaCons "AtLabel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: (C1 ('MetaCons "AtAlpha" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: C1 ('MetaCons "AtPhi" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "AtRho" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AtLambda" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AtDelta" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AtMeta" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))
Show Attribute Source # 
Instance details

Defined in Ast

Eq Attribute Source # 
Instance details

Defined in Ast

Pretty Attribute Source # 
Instance details

Defined in Pretty

Methods

pretty :: Attribute -> Doc ann #

prettyList :: [Attribute] -> Doc ann #

type Rep Attribute Source # 
Instance details

Defined in Ast

type Rep Attribute = D1 ('MetaData "Attribute" "Ast" "phino-0.0.0.17-2b1tbfUUh36B5bHKuQ8jM7" 'False) ((C1 ('MetaCons "AtLabel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: (C1 ('MetaCons "AtAlpha" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: C1 ('MetaCons "AtPhi" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "AtRho" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AtLambda" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AtDelta" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AtMeta" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))