satchmo-2.9.9.3: SAT encoding monad

Safe HaskellNone
LanguageHaskell98

Satchmo.Set.Data

Synopsis

Documentation

data Set a Source

Instances

(Functor m, Decode m Boolean Bool, Ord a) => Decode m (Set a) (Set a) Source 

unknown :: (MonadSAT m, Ord a) => [a] -> m (Set a) Source

allocate an unknown subset of these elements

unknownSingleton :: (Ord k, MonadSAT m) => [k] -> m (Set k) Source

constant :: (MonadSAT m, Ord a) => [a] -> m (Set a) Source

member :: (Ord k, MonadSAT m) => k -> Set k -> m Boolean Source

keys :: Set k -> [k] Source

keysSet :: Set k -> Set k Source

keys :: Set k -> [k] Source

assocs :: Set k -> [(k, Boolean)] Source

all2 :: (Ord k, MonadSAT m) => (Boolean -> Boolean -> m Boolean) -> Set k -> Set k -> m Boolean Source

common2 :: (Ord t, MonadSAT f) => (Boolean -> Boolean -> f Boolean) -> Set t -> Set t -> f (Set t) Source