{-# LANGUAGE TypeFamilies #-} module Data.Array.Comfort.Boxed.Unchecked ( Array(..), reshape, mapShape, (!), toList, fromList, vectorFromList, replicate, map, zipWith, ) where import qualified Data.Array.Comfort.Shape as Shape import qualified Data.Primitive.Array as Prim -- FixMe: In GHC-7.4.2 there is no instance PrimMonad (Lazy.ST s) -- import qualified Control.Monad.ST.Lazy as ST import qualified Control.Monad.ST.Strict as ST import Control.Monad (liftM) import Control.Applicative (Applicative, pure, (<*>), (<$>)) import Control.DeepSeq (NFData, rnf) import qualified Data.Traversable as Trav import qualified Data.Foldable as Fold import qualified Data.List as List import Prelude hiding (map, zipWith, replicate) data Array sh a = Array { shape :: sh, buffer :: Prim.Array a } instance (Shape.C sh, Show sh, Show a) => Show (Array sh a) where showsPrec p arr = showParen (p>10) $ showString "BoxedArray.fromList " . showsPrec 11 (shape arr) . showChar ' ' . shows (toList arr) instance (Shape.C sh, NFData sh, NFData a) => NFData (Array sh a) where rnf a@(Array sh _arr) = rnf (sh, toList a) instance (Shape.C sh) => Functor (Array sh) where fmap = map {- | We must restrict 'Applicative' to 'Shape.Static' because of 'pure'. Because the shape is static, we do not need a size check in '(<*>)'. -} instance (Shape.Static sh) => Applicative (Array sh) where pure = replicate Shape.static (<*>) = zipWith ($) instance (Shape.C sh) => Fold.Foldable (Array sh) where fold = Fold.fold . buffer foldMap f = Fold.foldMap f . buffer foldl f a = Fold.foldl f a . buffer foldr f a = Fold.foldr f a . buffer foldl1 f = Fold.foldl1 f . buffer foldr1 f = Fold.foldr1 f . buffer instance (Shape.C sh) => Trav.Traversable (Array sh) where traverse f (Array sh arr) = Array sh <$> Trav.traverse f arr sequenceA (Array sh arr) = Array sh <$> Trav.sequenceA arr mapM f (Array sh arr) = liftM (Array sh) $ Trav.mapM f arr sequence (Array sh arr) = liftM (Array sh) $ Trav.sequence arr reshape :: sh1 -> Array sh0 a -> Array sh1 a reshape sh (Array _ arr) = Array sh arr mapShape :: (sh0 -> sh1) -> Array sh0 a -> Array sh1 a mapShape f (Array sh arr) = Array (f sh) arr infixl 9 ! (!) :: (Shape.Indexed sh) => Array sh a -> Shape.Index sh -> a (!) (Array sh arr) ix = Prim.indexArray arr $ Shape.uncheckedOffset sh ix toList :: (Shape.C sh) => Array sh a -> [a] toList (Array sh arr) = List.map (Prim.indexArray arr) $ take (Shape.size sh) [0..] fromList :: (Shape.C sh) => sh -> [a] -> Array sh a fromList sh xs = Array sh $ Prim.fromListN (Shape.size sh) xs vectorFromList :: [a] -> Array (Shape.ZeroBased Int) a vectorFromList xs = let arr = Prim.fromList xs in Array (Shape.ZeroBased $ Prim.sizeofArray arr) arr replicate :: (Shape.C sh) => sh -> a -> Array sh a replicate sh a = Array sh $ ST.runST (Prim.unsafeFreezeArray =<< Prim.newArray (Shape.size sh) a) map :: (Shape.C sh) => (a -> b) -> Array sh a -> Array sh b map f (Array sh arr) = Array sh $ let n = Shape.size sh in Prim.fromListN n $ List.map (f . Prim.indexArray arr) $ take n [0..] zipWith :: (Shape.C sh) => (a -> b -> c) -> Array sh a -> Array sh b -> Array sh c zipWith f (Array sha arra) (Array _shb arrb) = Array sha $ let n = Shape.size sha in Prim.fromListN n $ List.map (\k -> f (Prim.indexArray arra k) (Prim.indexArray arrb k)) $ take n [0..]