comfort-array-0.1: Arrays where the index type is a function of the shape type

Safe HaskellNone
LanguageHaskell98

Data.Array.Comfort.Storable.Internal

Documentation

data Array sh a Source #

Constructors

Array 

Fields

Instances
(C sh, Show sh, Storable a, Show a) => Show (Array sh a) Source # 
Instance details

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 #

(!) :: (Indexed 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 #

unsafeCreateWithSizeAndResult :: (C sh, Storable a) => sh -> (Int -> Ptr a -> IO b) -> (Array sh a, b) Source #

toList :: (C sh, Storable a) => Array sh a -> [a] Source #

fromList :: (C sh, Storable a) => sh -> [a] -> Array sh 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 #

createWithSizeAndResultIO :: (C sh, Storable a) => sh -> (Int -> Ptr a -> IO b) -> IO (Array sh a, b) Source #

showIO :: (C sh, Show sh, Storable a, Show a) => Array sh a -> IO String Source #

readIO :: (Indexed 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 #