Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- newtype BitSeq = BitSeq {}
- mempty :: Monoid a => a
- size :: BitSeq -> Count
- fromWord64s :: Traversable f => f Word64 -> BitSeq
- fromPartialWord64s :: Traversable f => f (Word64, Count) -> BitSeq
- toPartialWord64s :: BitSeq -> [(Word64, Count)]
- fromBools :: [Bool] -> BitSeq
- toBools :: BitSeq -> [Bool]
- splitAt :: Count -> BitSeq -> (BitSeq, BitSeq)
- take :: Count -> BitSeq -> BitSeq
- drop :: Count -> BitSeq -> BitSeq
- (<|) :: Cons v => Elem v -> v -> v
- (><) :: (Semigroup v, Container v) => v -> v -> v
- (|>) :: Snoc v => v -> Elem v -> v
- select1 :: Select1 v => v -> Count -> Count
Documentation
Instances
Show BitSeq Source # | |
Generic BitSeq Source # | |
Semigroup BitSeq Source # | |
NFData BitSeq Source # | |
Defined in HaskellWorks.Data.RankSelect.Internal.BitSeq | |
PopCount1 BitSeq Source # | |
Defined in HaskellWorks.Data.RankSelect.Internal.BitSeq | |
Snoc BitSeq Source # | |
Cons BitSeq Source # | |
Container BitSeq Source # | |
Defined in HaskellWorks.Data.RankSelect.Internal.BitSeq | |
Select1 BitSeq Source # | |
Rank1 BitSeq Source # | |
type Rep BitSeq Source # | |
Defined in HaskellWorks.Data.RankSelect.Internal.BitSeq | |
type Elem BitSeq Source # | |
Defined in HaskellWorks.Data.RankSelect.Internal.BitSeq |
fromWord64s :: Traversable f => f Word64 -> BitSeq Source #
fromPartialWord64s :: Traversable f => f (Word64, Count) -> BitSeq Source #