Copyright | (c) 2019 Edward Kmett |
---|---|
License | BSD-2-Clause OR Apache-2.0 |
Maintainer | Edward Kmett <ekmett@gmail.com> |
Stability | experimental |
Portability | non-portable |
Safe Haskell | Trustworthy |
Language | Haskell2010 |
Documentation
data ConstPrimArray s a Source #
Instances
Constable (ConstPrimArray s :: Type -> Type) (ConstPrimArray s :: Type -> Type) Source # | |
Defined in Data.Const.Unsafe | |
Constable (ConstPrimArray s :: Type -> Type) (MutablePrimArray s :: Type -> Type) Source # | |
Defined in Data.Const.Unsafe | |
Eq (ConstPrimArray s a) Source # | |
Defined in Data.Const.Unsafe (==) :: ConstPrimArray s a -> ConstPrimArray s a -> Bool # (/=) :: ConstPrimArray s a -> ConstPrimArray s a -> Bool # |
constPrimArray :: APrimArray s p => p a -> ConstPrimArray s a Source #
type APrimArray s = Constable (ConstPrimArray s) Source #
readAPrimArray :: forall a m p. (Prim a, PrimMonad m, APrimArray (PrimState m) p) => p a -> Int -> m a Source #
samePrimArray :: forall s a p q. (APrimArray s p, APrimArray s q) => p a -> q a -> Bool Source #
copyAPrimArray :: forall m a p. (Prim a, PrimMonad m, APrimArray (PrimState m) p) => MutablePrimArray (PrimState m) a -> Int -> p a -> Int -> Int -> m () Source #
copyAPrimArrayToPtr :: forall m a p. (Prim a, PrimMonad m, APrimArray (PrimState m) p) => Ptr a -> p a -> Int -> Int -> m () Source #
sizeofAPrimArray :: forall s a p. (Prim a, APrimArray s p) => p a -> Int Source #
getSizeofAPrimArray :: forall m a p. (Prim a, PrimMonad m, APrimArray (PrimState m) p) => p a -> m Int Source #