Safe Haskell | None |
---|---|
Language | Haskell98 |
Documentation
Instances
Eq Term Source # | |
Ord Term Source # | |
Show Term # | |
Pretty Term # | |
Defined in Jukebox.TPTP.Print pPrintPrec :: PrettyLevel -> Rational -> Term -> Doc # pPrintList :: PrettyLevel -> [Term] -> Doc # | |
Named Term Source # | |
Unpack Term Source # | |
Symbolic Term Source # | |
Typed Term Source # | |
TermLike Term Source # | |
Instances
Functor Signed Source # | |
Foldable Signed Source # | |
Defined in Jukebox.Form fold :: Monoid m => Signed m -> m # foldMap :: Monoid m => (a -> m) -> Signed a -> m # foldr :: (a -> b -> b) -> b -> Signed a -> b # foldr' :: (a -> b -> b) -> b -> Signed a -> b # foldl :: (b -> a -> b) -> b -> Signed a -> b # foldl' :: (b -> a -> b) -> b -> Signed a -> b # foldr1 :: (a -> a -> a) -> Signed a -> a # foldl1 :: (a -> a -> a) -> Signed a -> a # elem :: Eq a => a -> Signed a -> Bool # maximum :: Ord a => Signed a -> a # minimum :: Ord a => Signed a -> a # | |
Traversable Signed Source # | |
Eq a => Eq (Signed a) Source # | |
Ord a => Ord (Signed a) Source # | |
Defined in Jukebox.Form | |
Show a => Show (Signed a) Source # | |
Symbolic a => Unpack (Signed a) Source # | |
Symbolic a => Symbolic (Signed a) Source # | |
Literal Literal | |
Not Form | |
And [Form] | |
Or [Form] | |
Equiv Form Form | |
ForAll !(Bind Form) | |
Exists !(Bind Form) | |
Connective Connective Form Form |
Instances
Eq Form Source # | |
Ord Form Source # | |
Show Form # | |
Pretty Form # | |
Defined in Jukebox.TPTP.Print pPrintPrec :: PrettyLevel -> Rational -> Form -> Doc # pPrintList :: PrettyLevel -> [Form] -> Doc # | |
Unpack Form Source # | |
Symbolic Form Source # | |
FormulaLike Form Source # | |
Defined in Jukebox.TPTP.Parse.Core fromFormula :: Form -> Form Source # | |
TermLike Form Source # | |
data Connective Source #
Instances
Eq Connective Source # | |
Defined in Jukebox.Form (==) :: Connective -> Connective -> Bool # (/=) :: Connective -> Connective -> Bool # | |
Ord Connective Source # | |
Defined in Jukebox.Form compare :: Connective -> Connective -> Ordering # (<) :: Connective -> Connective -> Bool # (<=) :: Connective -> Connective -> Bool # (>) :: Connective -> Connective -> Bool # (>=) :: Connective -> Connective -> Bool # max :: Connective -> Connective -> Connective # min :: Connective -> Connective -> Connective # | |
Show Connective # | |
Defined in Jukebox.TPTP.Print showsPrec :: Int -> Connective -> ShowS # show :: Connective -> String # showList :: [Connective] -> ShowS # |
connective :: Connective -> Form -> Form -> Form Source #
notInwards :: Form -> Form Source #
CNF | |
|
toLiterals :: Clause -> [Literal] Source #
data NoAnswerReason Source #
Instances
Eq NoAnswerReason Source # | |
Defined in Jukebox.Form (==) :: NoAnswerReason -> NoAnswerReason -> Bool # (/=) :: NoAnswerReason -> NoAnswerReason -> Bool # | |
Ord NoAnswerReason Source # | |
Defined in Jukebox.Form compare :: NoAnswerReason -> NoAnswerReason -> Ordering # (<) :: NoAnswerReason -> NoAnswerReason -> Bool # (<=) :: NoAnswerReason -> NoAnswerReason -> Bool # (>) :: NoAnswerReason -> NoAnswerReason -> Bool # (>=) :: NoAnswerReason -> NoAnswerReason -> Bool # max :: NoAnswerReason -> NoAnswerReason -> NoAnswerReason # min :: NoAnswerReason -> NoAnswerReason -> NoAnswerReason # | |
Show NoAnswerReason Source # | |
Defined in Jukebox.Form showsPrec :: Int -> NoAnswerReason -> ShowS # show :: NoAnswerReason -> String # showList :: [NoAnswerReason] -> ShowS # |
data UnsatReason Source #
Instances
Eq UnsatReason Source # | |
Defined in Jukebox.Form (==) :: UnsatReason -> UnsatReason -> Bool # (/=) :: UnsatReason -> UnsatReason -> Bool # | |
Ord UnsatReason Source # | |
Defined in Jukebox.Form compare :: UnsatReason -> UnsatReason -> Ordering # (<) :: UnsatReason -> UnsatReason -> Bool # (<=) :: UnsatReason -> UnsatReason -> Bool # (>) :: UnsatReason -> UnsatReason -> Bool # (>=) :: UnsatReason -> UnsatReason -> Bool # max :: UnsatReason -> UnsatReason -> UnsatReason # min :: UnsatReason -> UnsatReason -> UnsatReason # | |
Show UnsatReason Source # | |
Defined in Jukebox.Form showsPrec :: Int -> UnsatReason -> ShowS # show :: UnsatReason -> String # showList :: [UnsatReason] -> ShowS # |
type CNFRefutation = [String] Source #
explainAnswer :: Answer -> String Source #
Instances
Functor Input Source # | |
Foldable Input Source # | |
Defined in Jukebox.Form fold :: Monoid m => Input m -> m # foldMap :: Monoid m => (a -> m) -> Input a -> m # foldr :: (a -> b -> b) -> b -> Input a -> b # foldr' :: (a -> b -> b) -> b -> Input a -> b # foldl :: (b -> a -> b) -> b -> Input a -> b # foldl' :: (b -> a -> b) -> b -> Input a -> b # foldr1 :: (a -> a -> a) -> Input a -> a # foldl1 :: (a -> a -> a) -> Input a -> a # elem :: Eq a => a -> Input a -> Bool # maximum :: Ord a => Input a -> a # minimum :: Ord a => Input a -> a # | |
Traversable Input Source # | |
Pretty a => Show (Input a) # | |
Pretty a => Pretty (Input a) # | |
Defined in Jukebox.TPTP.Print pPrintPrec :: PrettyLevel -> Rational -> Input a -> Doc # pPrintList :: PrettyLevel -> [Input a] -> Doc # | |
Symbolic a => Unpack (Input a) Source # | |
Symbolic a => Symbolic (Input a) Source # | |
Form :: TypeOf Form | |
Clause_ :: TypeOf Clause | |
Term :: TypeOf Term | |
Atomic :: TypeOf Atomic | |
Signed :: (Symbolic a, Symbolic (Signed a)) => TypeOf (Signed a) | |
Bind_ :: (Symbolic a, Symbolic (Bind a)) => TypeOf (Bind a) | |
List :: (Symbolic a, Symbolic [a]) => TypeOf [a] | |
Input_ :: (Symbolic a, Symbolic (Input a)) => TypeOf (Input a) | |
CNF_ :: TypeOf CNF |
class Symbolic a where Source #
Instances
Symbolic Clause Source # | |
Symbolic CNF Source # | |
Symbolic Form Source # | |
Symbolic Atomic Source # | |
Symbolic Term Source # | |
Symbolic a => Symbolic [a] Source # | |
Defined in Jukebox.Form | |
Symbolic a => Symbolic (Input a) Source # | |
Symbolic a => Symbolic (Bind a) Source # | |
Symbolic a => Symbolic (Signed a) Source # | |
recursively :: Symbolic a => (forall a. Symbolic a => a -> a) -> a -> a Source #
termsAndBinders :: forall a b. Symbolic a => (Term -> DList b) -> (forall a. Symbolic a => Bind a -> [b]) -> a -> [b] Source #
eraseTypes :: Symbolic a => a -> a Source #
uniqueNames :: Symbolic a => a -> NameM a Source #