Safe Haskell | None |
---|---|
Language | GHC2021 |
Test.Credit.Sortable.Base
Documentation
data SortableOp a Source #
Instances
Arbitrary a => Arbitrary (SortableOp a) Source # | |
Defined in Test.Credit.Sortable.Base | |
Show a => Show (SortableOp a) Source # | |
Defined in Test.Credit.Sortable.Base Methods showsPrec :: Int -> SortableOp a -> ShowS # show :: SortableOp a -> String # showList :: [SortableOp a] -> ShowS # | |
Eq a => Eq (SortableOp a) Source # | |
Defined in Test.Credit.Sortable.Base | |
Ord a => Ord (SortableOp a) Source # | |
Defined in Test.Credit.Sortable.Base Methods compare :: SortableOp a -> SortableOp a -> Ordering # (<) :: SortableOp a -> SortableOp a -> Bool # (<=) :: SortableOp a -> SortableOp a -> Bool # (>) :: SortableOp a -> SortableOp a -> Bool # (>=) :: SortableOp a -> SortableOp a -> Bool # max :: SortableOp a -> SortableOp a -> SortableOp a # min :: SortableOp a -> SortableOp a -> SortableOp a # | |
(Arbitrary a, Ord a, BoundedSortable q, Show a) => DataStructure (S q a) (SortableOp a) Source # | |
class Sortable (q :: Type -> (Type -> Type) -> Type) where Source #
Methods
empty :: MonadLazy m => m (q a m) Source #
add :: (MonadCredit m, Ord a) => a -> q a m -> m (q a m) Source #
sort :: (MonadCredit m, Ord a) => q a m -> m [a] Source #
Instances
Sortable FingerSort Source # | |
Defined in Test.Credit.Finger Methods empty :: MonadLazy m => m (FingerSort a m) Source # add :: (MonadCredit m, Ord a) => a -> FingerSort a m -> m (FingerSort a m) Source # sort :: (MonadCredit m, Ord a) => FingerSort a m -> m [a] Source # | |
Sortable MergeSort Source # | |
Sortable SMergeSort Source # | |
Defined in Test.Credit.Sortable.Scheduled Methods empty :: MonadLazy m => m (SMergeSort a m) Source # add :: (MonadCredit m, Ord a) => a -> SMergeSort a m -> m (SMergeSort a m) Source # sort :: (MonadCredit m, Ord a) => SMergeSort a m -> m [a] Source # |
class Sortable q => BoundedSortable (q :: Type -> (Type -> Type) -> Type) where Source #
Instances
BoundedSortable FingerSort Source # | |
Defined in Test.Credit.Finger | |
BoundedSortable MergeSort Source # | |
Defined in Test.Credit.Sortable.MergeSort | |
BoundedSortable SMergeSort Source # | |
Defined in Test.Credit.Sortable.Scheduled |
data S (q :: Type -> k -> Type) a (m :: k) Source #
Constructors
S (q (PrettyCell a) m) |
Instances
MemoryCell m (q (PrettyCell a) m) => MemoryCell m (S q a m) Source # | |
Defined in Test.Credit.Sortable.Base Methods prettyCell :: S q a m -> m Memory Source # | |
MemoryStructure (q (PrettyCell a)) => MemoryStructure (S q a) Source # | |
Defined in Test.Credit.Sortable.Base Methods prettyStructure :: MonadMemory m => S q a m -> m Memory Source # | |
(Arbitrary a, Ord a, BoundedSortable q, Show a) => DataStructure (S q a) (SortableOp a) Source # | |