Data.Vector.Generic.Mutable (original) (raw)
Instance details
Defined in Data.Vector.Mutable
Prim a => MVector MVector a Source #
Instance details
Defined in Data.Vector.Primitive.Mutable
Storable a => MVector MVector a Source #
Instance details
Defined in Data.Vector.Storable.Mutable
Instance details
Defined in Data.Vector.Strict.Mutable
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Int16 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Int32 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Int64 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Word16 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Word32 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Word64 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Word8 Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Double Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector Float Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Complex a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Identity a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Down a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (First a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Last a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Max a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Min a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (WrappedMonoid a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Dual a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Product a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox a => MVector MVector (Sum a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector (DoNotUnboxLazy a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
NFData a => MVector MVector (DoNotUnboxNormalForm a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
MVector MVector (DoNotUnboxStrict a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Prim a => MVector MVector (UnboxViaPrim a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
(Unbox a, Unbox b) => MVector MVector (Arg a b) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
(IsoUnbox a b, Unbox b) => MVector MVector (As a b) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
(Unbox a, Unbox b) => MVector MVector (a, b) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Methods
basicLength :: MVector s (a, b) -> Int Source #
basicUnsafeSlice :: Int -> Int -> MVector s (a, b) -> MVector s (a, b) Source #
basicOverlaps :: MVector s (a, b) -> MVector s (a, b) -> Bool Source #
basicUnsafeNew :: Int -> ST s (MVector s (a, b)) Source #
basicInitialize :: MVector s (a, b) -> ST s () Source #
basicUnsafeReplicate :: Int -> (a, b) -> ST s (MVector s (a, b)) Source #
basicUnsafeRead :: MVector s (a, b) -> Int -> ST s (a, b) Source #
basicUnsafeWrite :: MVector s (a, b) -> Int -> (a, b) -> ST s () Source #
basicClear :: MVector s (a, b) -> ST s () Source #
basicSet :: MVector s (a, b) -> (a, b) -> ST s () Source #
basicUnsafeCopy :: MVector s (a, b) -> MVector s (a, b) -> ST s () Source #
basicUnsafeMove :: MVector s (a, b) -> MVector s (a, b) -> ST s () Source #
basicUnsafeGrow :: MVector s (a, b) -> Int -> ST s (MVector s (a, b)) Source #
Unbox a => MVector MVector (Const a b) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Unbox (f a) => MVector MVector (Alt f a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
(Unbox a, Unbox b, Unbox c) => MVector MVector (a, b, c) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Methods
basicLength :: MVector s (a, b, c) -> Int Source #
basicUnsafeSlice :: Int -> Int -> MVector s (a, b, c) -> MVector s (a, b, c) Source #
basicOverlaps :: MVector s (a, b, c) -> MVector s (a, b, c) -> Bool Source #
basicUnsafeNew :: Int -> ST s (MVector s (a, b, c)) Source #
basicInitialize :: MVector s (a, b, c) -> ST s () Source #
basicUnsafeReplicate :: Int -> (a, b, c) -> ST s (MVector s (a, b, c)) Source #
basicUnsafeRead :: MVector s (a, b, c) -> Int -> ST s (a, b, c) Source #
basicUnsafeWrite :: MVector s (a, b, c) -> Int -> (a, b, c) -> ST s () Source #
basicClear :: MVector s (a, b, c) -> ST s () Source #
basicSet :: MVector s (a, b, c) -> (a, b, c) -> ST s () Source #
basicUnsafeCopy :: MVector s (a, b, c) -> MVector s (a, b, c) -> ST s () Source #
basicUnsafeMove :: MVector s (a, b, c) -> MVector s (a, b, c) -> ST s () Source #
basicUnsafeGrow :: MVector s (a, b, c) -> Int -> ST s (MVector s (a, b, c)) Source #
(Unbox a, Unbox b, Unbox c, Unbox d) => MVector MVector (a, b, c, d) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Methods
basicLength :: MVector s (a, b, c, d) -> Int Source #
basicUnsafeSlice :: Int -> Int -> MVector s (a, b, c, d) -> MVector s (a, b, c, d) Source #
basicOverlaps :: MVector s (a, b, c, d) -> MVector s (a, b, c, d) -> Bool Source #
basicUnsafeNew :: Int -> ST s (MVector s (a, b, c, d)) Source #
basicInitialize :: MVector s (a, b, c, d) -> ST s () Source #
basicUnsafeReplicate :: Int -> (a, b, c, d) -> ST s (MVector s (a, b, c, d)) Source #
basicUnsafeRead :: MVector s (a, b, c, d) -> Int -> ST s (a, b, c, d) Source #
basicUnsafeWrite :: MVector s (a, b, c, d) -> Int -> (a, b, c, d) -> ST s () Source #
basicClear :: MVector s (a, b, c, d) -> ST s () Source #
basicSet :: MVector s (a, b, c, d) -> (a, b, c, d) -> ST s () Source #
basicUnsafeCopy :: MVector s (a, b, c, d) -> MVector s (a, b, c, d) -> ST s () Source #
basicUnsafeMove :: MVector s (a, b, c, d) -> MVector s (a, b, c, d) -> ST s () Source #
basicUnsafeGrow :: MVector s (a, b, c, d) -> Int -> ST s (MVector s (a, b, c, d)) Source #
Unbox (f (g a)) => MVector MVector (Compose f g a) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => MVector MVector (a, b, c, d, e) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Methods
basicLength :: MVector s (a, b, c, d, e) -> Int Source #
basicUnsafeSlice :: Int -> Int -> MVector s (a, b, c, d, e) -> MVector s (a, b, c, d, e) Source #
basicOverlaps :: MVector s (a, b, c, d, e) -> MVector s (a, b, c, d, e) -> Bool Source #
basicUnsafeNew :: Int -> ST s (MVector s (a, b, c, d, e)) Source #
basicInitialize :: MVector s (a, b, c, d, e) -> ST s () Source #
basicUnsafeReplicate :: Int -> (a, b, c, d, e) -> ST s (MVector s (a, b, c, d, e)) Source #
basicUnsafeRead :: MVector s (a, b, c, d, e) -> Int -> ST s (a, b, c, d, e) Source #
basicUnsafeWrite :: MVector s (a, b, c, d, e) -> Int -> (a, b, c, d, e) -> ST s () Source #
basicClear :: MVector s (a, b, c, d, e) -> ST s () Source #
basicSet :: MVector s (a, b, c, d, e) -> (a, b, c, d, e) -> ST s () Source #
basicUnsafeCopy :: MVector s (a, b, c, d, e) -> MVector s (a, b, c, d, e) -> ST s () Source #
basicUnsafeMove :: MVector s (a, b, c, d, e) -> MVector s (a, b, c, d, e) -> ST s () Source #
basicUnsafeGrow :: MVector s (a, b, c, d, e) -> Int -> ST s (MVector s (a, b, c, d, e)) Source #
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => MVector MVector (a, b, c, d, e, f) Source #
Instance details
Defined in Data.Vector.Unboxed.Base
Methods
basicLength :: MVector s (a, b, c, d, e, f) -> Int Source #
basicUnsafeSlice :: Int -> Int -> MVector s (a, b, c, d, e, f) -> MVector s (a, b, c, d, e, f) Source #
basicOverlaps :: MVector s (a, b, c, d, e, f) -> MVector s (a, b, c, d, e, f) -> Bool Source #
basicUnsafeNew :: Int -> ST s (MVector s (a, b, c, d, e, f)) Source #
basicInitialize :: MVector s (a, b, c, d, e, f) -> ST s () Source #
basicUnsafeReplicate :: Int -> (a, b, c, d, e, f) -> ST s (MVector s (a, b, c, d, e, f)) Source #
basicUnsafeRead :: MVector s (a, b, c, d, e, f) -> Int -> ST s (a, b, c, d, e, f) Source #
basicUnsafeWrite :: MVector s (a, b, c, d, e, f) -> Int -> (a, b, c, d, e, f) -> ST s () Source #
basicClear :: MVector s (a, b, c, d, e, f) -> ST s () Source #
basicSet :: MVector s (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> ST s () Source #
basicUnsafeCopy :: MVector s (a, b, c, d, e, f) -> MVector s (a, b, c, d, e, f) -> ST s () Source #
basicUnsafeMove :: MVector s (a, b, c, d, e, f) -> MVector s (a, b, c, d, e, f) -> ST s () Source #
basicUnsafeGrow :: MVector s (a, b, c, d, e, f) -> Int -> ST s (MVector s (a, b, c, d, e, f)) Source #