| Safe Haskell | None |
|---|---|
| Language | GHC2021 |
Test.Credit.Heap.Base
Documentation
Instances
| Arbitrary a => Arbitrary (HeapOp a) Source # | |
| Show a => Show (HeapOp a) Source # | |
| Eq a => Eq (HeapOp a) Source # | |
| Ord a => Ord (HeapOp a) Source # | |
Defined in Test.Credit.Heap.Base | |
| (Arbitrary a, Ord a, BoundedHeap h, Show a) => DataStructure (BH h a) (HeapOp a) Source # | |
| (Arbitrary a, Ord a, BoundedHeap h, Show a) => DataStructure (H h a) (HeapOp a) Source # | |
class Heap (h :: Type -> (Type -> Type) -> Type) where Source #
Methods
empty :: MonadCredit m => m (h a m) Source #
insert :: (MonadCredit m, Ord a) => a -> h a m -> m (h a m) Source #
merge :: (MonadCredit m, Ord a) => h a m -> h a m -> m (h a m) Source #
splitMin :: (MonadCredit m, Ord a) => h a m -> m (Maybe (a, h a m)) Source #
Instances
class Heap h => BoundedHeap (h :: Type -> (Type -> Type) -> Type) where Source #
Instances
| BoundedHeap FingerHeap Source # | |
| BoundedHeap Binomial Source # | |
| BoundedHeap LazyPairing Source # | |
| BoundedHeap Scheduled Source # | |
| BoundedHeap (Pairing :: Type -> (Type -> Type) -> Type) Source # | |
data H (h :: Type -> k -> Type) a (m :: k) Source #
Instances
| MemoryCell m (h (PrettyCell a) m) => MemoryCell m (H h a m) Source # | |
Defined in Test.Credit.Heap.Base Methods prettyCell :: H h a m -> m Memory Source # | |
| MemoryStructure (h (PrettyCell a)) => MemoryStructure (H h a) Source # | |
Defined in Test.Credit.Heap.Base Methods prettyStructure :: MonadMemory m => H h a m -> m Memory Source # | |
| (Arbitrary a, Ord a, BoundedHeap h, Show a) => DataStructure (H h a) (HeapOp a) Source # | |
data BH (h :: Type -> k -> Type) a (m :: k) Source #
Instances
| MemoryCell m (h (PrettyCell a) m) => MemoryCell m (BH h a m) Source # | |
Defined in Test.Credit.Heap.Base Methods prettyCell :: BH h a m -> m Memory Source # | |
| MemoryStructure (h (PrettyCell a)) => MemoryStructure (BH h a) Source # | |
Defined in Test.Credit.Heap.Base Methods prettyStructure :: MonadMemory m => BH h a m -> m Memory Source # | |
| (Arbitrary a, Ord a, BoundedHeap h, Show a) => DataStructure (BH h a) (HeapOp a) Source # | |