Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Language.TL.AST
Description
stripped down tl AST adapted for td_api.tl
Synopsis
- type Ann = Maybe Text
- type Doc = Map Text Text
- class ToTerm a where
- class ToType a where
- id2t :: Ident -> Text
- fid2t :: FullIdent -> Text
- combConv :: Doc -> CombinatorDecl -> Combinator
- argsConv :: Doc -> Args -> [Arg]
- data Combinator = Combinator {}
- combArity :: Combinator -> Int
- combName :: Combinator -> Text
- data ADT = ADT {
- name :: Text
- ann :: Ann
- constructors :: [Combinator]
- newtype Function = Function Combinator
- data Type
- data Term
- data Arg = Arg {}
Documentation
combConv :: Doc -> CombinatorDecl -> Combinator Source #
data Combinator Source #
Instances
Eq Combinator Source # | |
Defined in Language.TL.AST | |
Show Combinator Source # | |
Defined in Language.TL.AST Methods showsPrec :: Int -> Combinator -> ShowS # show :: Combinator -> String # showList :: [Combinator] -> ShowS # | |
Generic Combinator Source # | |
Defined in Language.TL.AST Associated Types type Rep Combinator :: Type -> Type # | |
type Rep Combinator Source # | |
Defined in Language.TL.AST type Rep Combinator = D1 (MetaData "Combinator" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" False) (C1 (MetaCons "Combinator" PrefixI True) ((S1 (MetaSel (Just "ident") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "args") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 [Arg]) :*: S1 (MetaSel (Just "resType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Type)))) |
combArity :: Combinator -> Int Source #
combName :: Combinator -> Text Source #
Constructors
ADT | |
Fields
|
Instances
Eq ADT Source # | |
Show ADT Source # | |
Generic ADT Source # | |
type Rep ADT Source # | |
Defined in Language.TL.AST type Rep ADT = D1 (MetaData "ADT" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" False) (C1 (MetaCons "ADT" PrefixI True) (S1 (MetaSel (Just "name") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Ann) :*: S1 (MetaSel (Just "constructors") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 [Combinator])))) |
Constructors
Function Combinator |
Instances
Eq Function Source # | |
Show Function Source # | |
Generic Function Source # | |
type Rep Function Source # | |
Defined in Language.TL.AST type Rep Function = D1 (MetaData "Function" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" True) (C1 (MetaCons "Function" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Combinator))) |
Instances
Eq Type Source # | |
Show Type Source # | |
Generic Type Source # | |
type Rep Type Source # | |
Defined in Language.TL.AST type Rep Type = D1 (MetaData "Type" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" False) (C1 (MetaCons "Type" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text)) :+: (C1 (MetaCons "TypeApp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Type) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 [Type])) :+: C1 (MetaCons "NatType" PrefixI False) (U1 :: Type -> Type))) |
Instances
Eq Term Source # | |
Show Term Source # | |
Generic Term Source # | |
type Rep Term Source # | |
Defined in Language.TL.AST type Rep Term = D1 (MetaData "Term" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" False) (C1 (MetaCons "Var" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text)) :+: (C1 (MetaCons "Nat" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Int)) :+: C1 (MetaCons "App" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Term) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 [Term])))) |
Instances
Eq Arg Source # | |
Show Arg Source # | |
Generic Arg Source # | |
type Rep Arg Source # | |
Defined in Language.TL.AST type Rep Arg = D1 (MetaData "Arg" "Language.TL.AST" "language-tl-0.1.1-CjCXqHgjz8HB0qBNm94O9r" False) (C1 (MetaCons "Arg" PrefixI True) (S1 (MetaSel (Just "argName") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Ann) :*: S1 (MetaSel (Just "argType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Type)))) |