Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Language.REST.Internal.WQO
Synopsis
- empty :: WQO a
- insert :: (Ord a, Eq a, Hashable a) => WQO a -> (a, a, QORelation) -> ExtendOrderingResult a
- insertMaybe :: (Ord a, Eq a, Hashable a) => WQO a -> (a, a, QORelation) -> Maybe (WQO a)
- orderings :: (Ord a, Eq a, Hashable a) => Set a -> Set (WQO a)
- getRelation :: (Ord a, Eq a, Hashable a) => WQO a -> a -> a -> Maybe QORelation
- merge :: (Ord a, Eq a, Hashable a) => WQO a -> WQO a -> Maybe (WQO a)
- mergeAll :: (Show a, Ord a, Eq a, Hashable a) => [WQO a] -> Maybe (WQO a)
- notStrongerThan :: (Ord a, Eq a, Hashable a) => WQO a -> WQO a -> Bool
- data WQO a
- data QORelation
- data ExtendOrderingResult a
- = ValidExtension (WQO a)
- | AlreadyImplied
- | Contradicts
- relevantTo :: (Ord a, Eq a, Hashable a) => WQO a -> Set a -> Set a -> WQO a
- singleton :: (Ord a, Eq a, Hashable a) => (a, a, QORelation) -> Maybe (WQO a)
- null :: Eq a => WQO a -> Bool
- getPO :: WQO a -> PartialOrder (EquivalenceClass a)
- getECs :: WQO a -> Set (EquivalenceClass a)
- elems :: Ord a => WQO a -> Set a
Documentation
insert :: (Ord a, Eq a, Hashable a) => WQO a -> (a, a, QORelation) -> ExtendOrderingResult a Source #
insertMaybe :: (Ord a, Eq a, Hashable a) => WQO a -> (a, a, QORelation) -> Maybe (WQO a) Source #
orderings :: (Ord a, Eq a, Hashable a) => Set a -> Set (WQO a) Source #
Generates all the possible orderings of the elements in the given set.
getRelation :: (Ord a, Eq a, Hashable a) => WQO a -> a -> a -> Maybe QORelation Source #
getRelation (>=) a b == QEQ
iff a >= b
getRelation (>=) a b == QGT
iff a > b
notStrongerThan :: (Ord a, Eq a, Hashable a) => WQO a -> WQO a -> Bool Source #
w1
if it is possible to extend notStrongerThan
w2w1
with additional
relations to obtain w2
Well-founded reflexive partial orders
Instances
Generic (WQO a) Source # | |
(Show a, Eq a, Hashable a) => Show (WQO a) Source # | |
Eq a => Eq (WQO a) Source # | |
Ord a => Ord (WQO a) Source # | |
Hashable a => Hashable (WQO a) Source # | |
Defined in Language.REST.Internal.WQO | |
ToSMTVar a Int => ToSMT (WQO a) Bool Source # | |
type Rep (WQO a) Source # | |
Defined in Language.REST.Internal.WQO |
data QORelation Source #
Instances
Generic QORelation Source # | |||||
Defined in Language.REST.Internal.WQO Associated Types
| |||||
Show QORelation Source # | |||||
Defined in Language.REST.Internal.WQO Methods showsPrec :: Int -> QORelation -> ShowS # show :: QORelation -> String # showList :: [QORelation] -> ShowS # | |||||
Eq QORelation Source # | |||||
Defined in Language.REST.Internal.WQO | |||||
Ord QORelation Source # | |||||
Defined in Language.REST.Internal.WQO Methods compare :: QORelation -> QORelation -> Ordering # (<) :: QORelation -> QORelation -> Bool # (<=) :: QORelation -> QORelation -> Bool # (>) :: QORelation -> QORelation -> Bool # (>=) :: QORelation -> QORelation -> Bool # max :: QORelation -> QORelation -> QORelation # min :: QORelation -> QORelation -> QORelation # | |||||
Hashable QORelation Source # | |||||
Defined in Language.REST.Internal.WQO | |||||
type Rep QORelation Source # | |||||
data ExtendOrderingResult a Source #
Constructors
ValidExtension (WQO a) | |
AlreadyImplied | |
Contradicts |