comfort-array-0.0.1.1: Arrays where the index type is a function of the shape type
Data.Array.Comfort.Storable.Internal
data Array sh a Source #
Constructors
Fields
Defined in Data.Array.Comfort.Storable.Internal
Methods
showsPrec :: Int -> Array sh a -> ShowS #
show :: Array sh a -> String #
showList :: [Array sh a] -> ShowS #
reshape :: sh1 -> Array sh0 a -> Array sh1 a Source #
mapShape :: (sh0 -> sh1) -> Array sh0 a -> Array sh1 a Source #
(!) :: (C sh, Storable a) => Array sh a -> Index sh -> a infixl 9 Source #
unsafeCreate :: (C sh, Storable a) => sh -> (Ptr a -> IO ()) -> Array sh a Source #
unsafeCreateWithSize :: (C sh, Storable a) => sh -> (Int -> Ptr a -> IO ()) -> Array sh a Source #
toList :: (C sh, Storable a) => Array sh a -> [a] Source #
fromList :: (C sh, Storable a) => sh -> [a] -> Array sh a Source #
vectorFromList :: Storable a => [a] -> Array (ZeroBased Int) a Source #
map :: (C sh, Storable a, Storable b) => (a -> b) -> Array sh a -> Array sh b Source #
createIO :: (C sh, Storable a) => sh -> (Ptr a -> IO ()) -> IO (Array sh a) Source #
createWithSizeIO :: (C sh, Storable a) => sh -> (Int -> Ptr a -> IO ()) -> IO (Array sh a) Source #
showIO :: (C sh, Show sh, Storable a, Show a) => Array sh a -> IO String Source #
readIO :: (C sh, Storable a) => Array sh a -> Index sh -> IO a Source #
toListIO :: (C sh, Storable a) => Array sh a -> IO [a] Source #
fromListIO :: (C sh, Storable a) => sh -> [a] -> IO (Array sh a) Source #
vectorFromListIO :: Storable a => [a] -> IO (Array (ZeroBased Int) a) Source #