satyros-0.2.2.1: Step-by-step SAT solver for educational purposes
Safe HaskellNone
LanguageHaskell2010

Satyros.CNF.Clause

Documentation

newtype ClauseLike a Source #

Constructors

ClauseLike [a] 

Bundled Patterns

pattern Clause :: [Literal] -> Clause 

Instances

Instances details
Eq a => Eq (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Methods

(==) :: ClauseLike a -> ClauseLike a -> Bool #

(/=) :: ClauseLike a -> ClauseLike a -> Bool #

Ord a => Ord (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Show a => Show (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Generic (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Associated Types

type Rep (ClauseLike a) :: Type -> Type #

Methods

from :: ClauseLike a -> Rep (ClauseLike a) x #

to :: Rep (ClauseLike a) x -> ClauseLike a #

Semigroup (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Monoid (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Wrapped (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

Associated Types

type Unwrapped (ClauseLike a) #

Generic1 ClauseLike Source # 
Instance details

Defined in Satyros.CNF.Clause

Associated Types

type Rep1 ClauseLike :: k -> Type #

Methods

from1 :: forall (a :: k). ClauseLike a -> Rep1 ClauseLike a #

to1 :: forall (a :: k). Rep1 ClauseLike a -> ClauseLike a #

ClauseLike a1 ~ t => Rewrapped (ClauseLike a2) t Source # 
Instance details

Defined in Satyros.CNF.Clause

HasClauses (Storage s) (Vector Clause) Source # 
Instance details

Defined in Satyros.DPLL.Storage

type Rep (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

type Rep (ClauseLike a) = D1 ('MetaData "ClauseLike" "Satyros.CNF.Clause" "satyros-0.2.2.1-GdlwvJvvIuCOK4gG1gnoo" 'True) (C1 ('MetaCons "ClauseLike" 'PrefixI 'True) (S1 ('MetaSel ('Just "_literalsOfClause") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))
type Unwrapped (ClauseLike a) Source # 
Instance details

Defined in Satyros.CNF.Clause

type Unwrapped (ClauseLike a) = [a]
type Rep1 ClauseLike Source # 
Instance details

Defined in Satyros.CNF.Clause

type Rep1 ClauseLike = D1 ('MetaData "ClauseLike" "Satyros.CNF.Clause" "satyros-0.2.2.1-GdlwvJvvIuCOK4gG1gnoo" 'True) (C1 ('MetaCons "ClauseLike" 'PrefixI 'True) (S1 ('MetaSel ('Just "_literalsOfClause") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))