| Safe Haskell | None | 
|---|
Data.Containers.Sequence
- class Monoid t => Sequence t where
 - class Stream c s | s -> c where
 - take :: Sequence t => Int -> t -> t
 - drop :: Sequence t => Int -> t -> t
 - type Slice a = Vector a
 - data Slices a
 - slice :: (Storable a, Storable b) => Iso (Slice a) (Slice b) [a] [b]
 - slices :: (Storable a, Storable b) => Iso (Slices a) (Slices b) (Slice a) (Slice b)
 - _Slices :: Iso (Slices a) (Slices b) [Slice a] [Slice b]
 - breadth :: Storable a => Slices a -> Int
 - unsafeWith :: Storable a => Vector a -> (Ptr a -> IO b) -> IO b
 - sliceElt :: (Storable a, Storable b) => Action a b (Slice a) (Slice b)
 - span :: Stream c s => (c -> Bool) -> s -> ([c], s)
 - break :: Stream c s => (c -> Bool) -> s -> ([c], s)
 - takeWhile :: Stream c s => (c -> Bool) -> s -> [c]
 - takeUntil :: Stream c s => (c -> Bool) -> s -> [c]
 - dropWhile :: Stream c s => (c -> Bool) -> s -> s
 - dropUntil :: Stream c s => (c -> Bool) -> s -> s
 - (++) :: Stream c s => [c] -> s -> s