Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
data Identifier Source #
Instances
Eq Identifier Source # | |
Defined in Sygus.Syntax (==) :: Identifier -> Identifier -> Bool # (/=) :: Identifier -> Identifier -> Bool # | |
Read Identifier Source # | |
Defined in Sygus.Syntax readsPrec :: Int -> ReadS Identifier # readList :: ReadS [Identifier] # readPrec :: ReadPrec Identifier # readListPrec :: ReadPrec [Identifier] # | |
Show Identifier Source # | |
Defined in Sygus.Syntax showsPrec :: Int -> Identifier -> ShowS # show :: Identifier -> String # showList :: [Identifier] -> ShowS # |
TermIdent Identifier | |
TermLit Lit | |
TermCall Identifier [Term] | |
TermExists [SortedVar] Term | |
TermForAll [SortedVar] Term | |
TermLet [VarBinding] Term |
data VarBinding Source #
Instances
Eq VarBinding Source # | |
Defined in Sygus.Syntax (==) :: VarBinding -> VarBinding -> Bool # (/=) :: VarBinding -> VarBinding -> Bool # | |
Read VarBinding Source # | |
Defined in Sygus.Syntax readsPrec :: Int -> ReadS VarBinding # readList :: ReadS [VarBinding] # readPrec :: ReadPrec VarBinding # readListPrec :: ReadPrec [VarBinding] # | |
Show VarBinding Source # | |
Defined in Sygus.Syntax showsPrec :: Int -> VarBinding -> ShowS # show :: VarBinding -> String # showList :: [VarBinding] -> ShowS # |
DeclareDatatype Symbol DTDec | |
DeclareDatatypes [SortDecl] [DTDec] | |
DeclareSort Symbol Integer | |
DefineFun Symbol [SortedVar] Sort Term | |
DefineSort Symbol Sort | |
SetLogic Symbol | |
SetOption Symbol Lit |
data GrammarDef Source #
Instances
Eq GrammarDef Source # | |
Defined in Sygus.Syntax (==) :: GrammarDef -> GrammarDef -> Bool # (/=) :: GrammarDef -> GrammarDef -> Bool # | |
Read GrammarDef Source # | |
Defined in Sygus.Syntax readsPrec :: Int -> ReadS GrammarDef # readList :: ReadS [GrammarDef] # readPrec :: ReadPrec GrammarDef # readListPrec :: ReadPrec [GrammarDef] # | |
Show GrammarDef Source # | |
Defined in Sygus.Syntax showsPrec :: Int -> GrammarDef -> ShowS # show :: GrammarDef -> String # showList :: [GrammarDef] -> ShowS # |
data GroupedRuleList Source #
Instances
Eq GroupedRuleList Source # | |
Defined in Sygus.Syntax (==) :: GroupedRuleList -> GroupedRuleList -> Bool # (/=) :: GroupedRuleList -> GroupedRuleList -> Bool # | |
Read GroupedRuleList Source # | |
Defined in Sygus.Syntax | |
Show GroupedRuleList Source # | |
Defined in Sygus.Syntax showsPrec :: Int -> GroupedRuleList -> ShowS # show :: GroupedRuleList -> String # showList :: [GroupedRuleList] -> ShowS # |