NFData1 Vector | Since: vector-0.12.1.0 |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Bool | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Char | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Double | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Float | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Int | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Int8 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Int16 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Int32 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Int64 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Word | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Word8 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Word16 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Word32 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Word64 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector () | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector All | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Vector Vector Any | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Complex a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Min a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Max a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (First a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Last a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (WrappedMonoid a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Identity a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Dual a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Sum a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Product a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox a => Vector Vector (Down a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
(MonadIO io, Unboxed e, Unbox e) => Thaw io (Vector e) (MIOUblist io e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(MonadIO io, Unboxed e, Unbox e) => Thaw io (Vector e) (MIOBytes# io e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unbox a, Unbox b) => Vector Vector (a, b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (a, b) -> m (Vector (a, b)) # basicUnsafeThaw :: PrimMonad m => Vector (a, b) -> m (Mutable Vector (PrimState m) (a, b)) # basicLength :: Vector (a, b) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (a, b) -> Vector (a, b) # basicUnsafeIndexM :: Monad m => Vector (a, b) -> Int -> m (a, b) # basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (a, b) -> Vector (a, b) -> m () # elemseq :: Vector (a, b) -> (a, b) -> b0 -> b0 # |
(Unbox a, Unbox b) => Vector Vector (Arg a b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
(MonadIO io, Unboxed e, Unbox e) => Freeze io (MIOUblist io e) (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(MonadIO io, Unboxed e, Unbox e) => Freeze io (MIOBytes# io e) (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unbox a, Unbox b, Unbox c) => Vector Vector (a, b, c) | |
Instance detailsDefined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c) -> m (Vector (a, b, c)) # basicUnsafeThaw :: PrimMonad m => Vector (a, b, c) -> m (Mutable Vector (PrimState m) (a, b, c)) # basicLength :: Vector (a, b, c) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (a, b, c) -> Vector (a, b, c) # basicUnsafeIndexM :: Monad m => Vector (a, b, c) -> Int -> m (a, b, c) # basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c) -> Vector (a, b, c) -> m () # elemseq :: Vector (a, b, c) -> (a, b, c) -> b0 -> b0 # |
Unbox a => Vector Vector (Const a b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox (f a) => Vector Vector (Alt f a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
(Unbox a, Unbox b, Unbox c, Unbox d) => Vector Vector (a, b, c, d) | |
Instance detailsDefined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d) -> m (Vector (a, b, c, d)) # basicUnsafeThaw :: PrimMonad m => Vector (a, b, c, d) -> m (Mutable Vector (PrimState m) (a, b, c, d)) # basicLength :: Vector (a, b, c, d) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (a, b, c, d) -> Vector (a, b, c, d) # basicUnsafeIndexM :: Monad m => Vector (a, b, c, d) -> Int -> m (a, b, c, d) # basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d) -> Vector (a, b, c, d) -> m () # elemseq :: Vector (a, b, c, d) -> (a, b, c, d) -> b0 -> b0 # |
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => Vector Vector (a, b, c, d, e) | |
Instance detailsDefined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d, e) -> m (Vector (a, b, c, d, e)) # basicUnsafeThaw :: PrimMonad m => Vector (a, b, c, d, e) -> m (Mutable Vector (PrimState m) (a, b, c, d, e)) # basicLength :: Vector (a, b, c, d, e) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (a, b, c, d, e) -> Vector (a, b, c, d, e) # basicUnsafeIndexM :: Monad m => Vector (a, b, c, d, e) -> Int -> m (a, b, c, d, e) # basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d, e) -> Vector (a, b, c, d, e) -> m () # elemseq :: Vector (a, b, c, d, e) -> (a, b, c, d, e) -> b0 -> b0 # |
Unbox (f (g a)) => Vector Vector (Compose f g a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => Vector Vector (a, b, c, d, e, f) | |
Instance detailsDefined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d, e, f) -> m (Vector (a, b, c, d, e, f)) # basicUnsafeThaw :: PrimMonad m => Vector (a, b, c, d, e, f) -> m (Mutable Vector (PrimState m) (a, b, c, d, e, f)) # basicLength :: Vector (a, b, c, d, e, f) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (a, b, c, d, e, f) -> Vector (a, b, c, d, e, f) # basicUnsafeIndexM :: Monad m => Vector (a, b, c, d, e, f) -> Int -> m (a, b, c, d, e, f) # basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (a, b, c, d, e, f) -> Vector (a, b, c, d, e, f) -> m () # elemseq :: Vector (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> b0 -> b0 # |
(Data a, Unbox a) => Data (Vector a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
NFData (Vector a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
Unbox e => Nullable (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
Unbox e => Estimate (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
Unbox e => Scan (Vector e) e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
Unbox e => Bordered (Vector e) Int Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
Unbox e => Linear (Vector e) e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed Methods uncons :: Vector e -> (e, Vector e) # uncons' :: Vector e -> Maybe (e, Vector e) # toHead :: e -> Vector e -> Vector e # head :: Vector e -> e # tail :: Vector e -> Vector e # unsnoc :: Vector e -> (Vector e, e) # unsnoc' :: Vector e -> Maybe (Vector e, e) # toLast :: Vector e -> e -> Vector e # init :: Vector e -> Vector e # last :: Vector e -> e # single :: e -> Vector e # (++) :: Vector e -> Vector e -> Vector e # replicate :: Int -> e -> Vector e # fromList :: [e] -> Vector e # fromListN :: Int -> [e] -> Vector e # listR :: Vector e -> [e] # listL :: Vector e -> [e] # fromFoldable :: Foldable f => f e -> Vector e # (!^) :: Vector e -> Int -> e # write :: Vector e -> Int -> e -> Vector e # concat :: Foldable f => f (Vector e) -> Vector e # concatMap :: Foldable f => (a -> Vector e) -> f a -> Vector e # intersperse :: e -> Vector e -> Vector e # filter :: (e -> Bool) -> Vector e -> Vector e # except :: (e -> Bool) -> Vector e -> Vector e # partition :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # partitions :: Foldable f => f (e -> Bool) -> Vector e -> [Vector e] # select :: (e -> Maybe a) -> Vector e -> [a] # select' :: (t e ~ Vector e, Linear1 t a) => (e -> Maybe a) -> Vector e -> t a # extract :: (e -> Maybe a) -> Vector e -> ([a], Vector e) # extract' :: (t e ~ Vector e, Linear1 t a) => (e -> Maybe a) -> Vector e -> (t a, Vector e) # selects :: Foldable f => f (e -> Maybe a) -> Vector e -> ([[a]], Vector e) # selects' :: (Foldable f, t e ~ Vector e, Linear1 t a) => f (e -> Maybe a) -> Vector e -> ([t a], Vector e) # isSubseqOf :: Vector e -> Vector e -> Bool # reverse :: Vector e -> Vector e # force :: Vector e -> Vector e # subsequences :: Vector e -> [Vector e] # iterate :: Int -> (e -> e) -> e -> Vector e # nub :: Vector e -> Vector e # nubBy :: Equal e -> Vector e -> Vector e # ofoldr :: (Int -> e -> b -> b) -> b -> Vector e -> b # ofoldl :: (Int -> b -> e -> b) -> b -> Vector e -> b # ofoldr' :: (Int -> e -> b -> b) -> b -> Vector e -> b # ofoldl' :: (Int -> b -> e -> b) -> b -> Vector e -> b # o_foldr :: (e -> b -> b) -> b -> Vector e -> b # o_foldl :: (b -> e -> b) -> b -> Vector e -> b # o_foldr' :: (e -> b -> b) -> b -> Vector e -> b # o_foldl' :: (b -> e -> b) -> b -> Vector e -> b # |
Unbox e => Split (Vector e) e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed Methods take :: Int -> Vector e -> Vector e # drop :: Int -> Vector e -> Vector e # keep :: Int -> Vector e -> Vector e # sans :: Int -> Vector e -> Vector e # save :: Int -> Vector e -> Vector e # skip :: Int -> Vector e -> Vector e # split :: Int -> Vector e -> (Vector e, Vector e) # divide :: Int -> Vector e -> (Vector e, Vector e) # splits :: Foldable f => f Int -> Vector e -> [Vector e] # divides :: Foldable f => f Int -> Vector e -> [Vector e] # parts :: Foldable f => f Int -> Vector e -> [Vector e] # chunks :: Int -> Vector e -> [Vector e] # splitBy :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # divideBy :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # splitsBy :: (e -> Bool) -> Vector e -> [Vector e] # splitsOn :: Vector e -> Vector e -> [Vector e] # replaceBy :: Vector e -> Vector e -> Vector e -> Vector e # removeAll :: Vector e -> Vector e -> Vector e # combo :: Equal e -> Vector e -> Int # justifyL :: Int -> e -> Vector e -> Vector e # justifyR :: Int -> e -> Vector e -> Vector e # each :: Int -> Vector e -> Vector e # eachFrom :: Int -> Int -> Vector e -> Vector e # isPrefixOf :: Vector e -> Vector e -> Bool # isSuffixOf :: Vector e -> Vector e -> Bool # isInfixOf :: Vector e -> Vector e -> Bool # prefix :: (e -> Bool) -> Vector e -> Int # suffix :: (e -> Bool) -> Vector e -> Int # infixes :: Vector e -> Vector e -> [Int] # dropSide :: (e -> Bool) -> Vector e -> Vector e # takeWhile :: (e -> Bool) -> Vector e -> Vector e # dropWhile :: (e -> Bool) -> Vector e -> Vector e # takeEnd :: (e -> Bool) -> Vector e -> Vector e # dropEnd :: (e -> Bool) -> Vector e -> Vector e # spanl :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # breakl :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # spanr :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # breakr :: (e -> Bool) -> Vector e -> (Vector e, Vector e) # selectWhile :: (e -> Maybe a) -> Vector e -> [a] # selectEnd :: (e -> Maybe a) -> Vector e -> [a] # extractWhile :: (e -> Maybe a) -> Vector e -> ([a], Vector e) # extractEnd :: (e -> Maybe a) -> Vector e -> (Vector e, [a]) # selectWhile' :: (t e ~ l, Split1 t a) => (e -> Maybe a) -> Vector e -> t a # selectEnd' :: (t e ~ l, Split1 t a) => (e -> Maybe a) -> Vector e -> t a # extractWhile' :: (t e ~ l, Split1 t a) => (e -> Maybe a) -> Vector e -> (t a, Vector e) # extractEnd' :: (t e ~ l, Split1 t a) => (e -> Maybe a) -> Vector e -> (Vector e, t a) # |
(Unboxed e, Unbox e) => Sort (Vector e) e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Indexed (Vector e) Int e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Map (Vector e) Int e Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Thaw (ST s) (Vector e) (STUblist s e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Thaw (ST s) (Vector e) (STBytes# s e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Freeze (ST s) (STUblist s e) (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
(Unboxed e, Unbox e) => Freeze (ST s) (STBytes# s e) (Vector e) Source # | |
Instance detailsDefined in SDP.Vector.Unboxed |
newtype Vector Bool | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Char | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Double | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Float | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Int | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Int8 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Int16 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Int32 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Int64 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Word | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Word8 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Word16 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Word32 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Word64 | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector () | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector All | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector Any | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
type Mutable Vector | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
type Item (Vector e) | |
Instance detailsDefined in Data.Vector.Unboxed |
newtype Vector (Complex a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Min a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Max a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (First a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Last a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (WrappedMonoid a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Identity a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Dual a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Sum a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Product a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Down a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
data Vector (a, b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Arg a b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
data Vector (a, b, c) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Const a b) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Alt f a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
data Vector (a, b, c, d) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
data Vector (a, b, c, d, e) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
newtype Vector (Compose f g a) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |
data Vector (a, b, c, d, e, f) | |
Instance detailsDefined in Data.Vector.Unboxed.Base |