repa-array-4.2.3.1: Bulk array representations and operators.

Safe HaskellNone
LanguageHaskell98

Data.Repa.Array.Material.Auto

Contents

Synopsis

Documentation

data A Source #

Arrays where the elements that are automatically layed out into some efficient runtime representation.

The implementation uses type families to chose unboxed representations for all elements that can be unboxed. In particular: arrays of unboxed tuples are represented as tuples of unboxed arrays, and nested arrays are represented using a segment descriptor and a single single flat vector containing all the elements.

Constructors

Auto 

Fields

Instances

Eq A Source # 

Methods

(==) :: A -> A -> Bool #

(/=) :: A -> A -> Bool #

Show A Source # 

Methods

showsPrec :: Int -> A -> ShowS #

show :: A -> String #

showList :: [A] -> ShowS #

Layout A Source # 

Associated Types

data Name A :: * Source #

type Index A :: * Source #

Eq (Name A) Source # 

Methods

(==) :: Name A -> Name A -> Bool #

(/=) :: Name A -> Name A -> Bool #

Show (Name A) Source # 

Methods

showsPrec :: Int -> Name A -> ShowS #

show :: Name A -> String #

showList :: [Name A] -> ShowS #

data Name A Source # 
data Name A = A
type Index A Source # 
type Index A = Int
data Array A Char Source # 
data Array A Double Source # 
data Array A Float Source # 
data Array A Int Source # 
data Array A Int8 Source # 
data Array A Int16 Source # 
data Array A Int32 Source # 
data Array A Int64 Source # 
data Array A Word8 Source # 
data Array A () Source # 
data Array A () = AArray_Unit !Int
data Array A Date32 Source # 
data Array A Text Source # 
data Buffer A Char Source # 
data Buffer A Double Source # 
data Buffer A Float Source # 
data Buffer A Int Source # 
data Buffer A Int8 Source # 
data Buffer A Int16 Source # 
data Buffer A Int32 Source # 
data Buffer A Int64 Source # 
data Buffer A Word8 Source # 
data Buffer A () Source # 
data Buffer A Date32 Source # 
data Buffer A Text Source # 
data Array A [a] Source # 
data Array A [a] = AArray_List !(Array B [a])
data Array A (Maybe a) Source # 
data Array A (Maybe a) = AArray_Maybe !(Array B (Maybe a))
data Array A (Box a) Source # 
data Array A (Box a) = AArray_Box !(Array B a)
data Buffer A [a] Source # 
data Buffer A [a] = ABuffer_List !(Buffer B [a])
data Buffer A (Maybe a) Source # 
data Buffer A (Box a) Source # 
data Buffer A (Box a) = ABuffer_Box !(Buffer B a)
type Select' Z (Array A ((:*:) t1 ts)) # 
type Select' Z (Array A ((:*:) t1 ts)) = Array A t1
type Discard' Z (Array A ((:*:) t1 ts)) # 
type Discard' Z (Array A ((:*:) t1 ts)) = Array A ts
type Mask' () (Array A ()) # 
type Mask' () (Array A ()) = Array A ()
data Array A (a, b) Source # 
data Array A (a, b) = AArray_T2 !(Array (T2 A A) (a, b))
data Array A ((:*:) a b) Source # 
data Array A ((:*:) a b) = AArray_Prod !(Array A a) !(Array A b)
data Array A (Array r a) Source # 
data Array A (Array r a) = AArray_Array !(Array N (Array r a))
data Buffer A (a, b) Source # 
data Buffer A (a, b) = ABuffer_T2 !(Buffer (T2 A A) (a, b))
data Buffer A ((:*:) a b) Source # 
data Buffer A ((:*:) a b) = ABuffer_Prod !(Buffer A a) !(Buffer A b)
data Buffer A (Array l a) Source # 
data Buffer A (Array l a) = ABuffer_Array !(Buffer N (Array l a))
type Select' (S n) (Array A ((:*:) t1 ts)) # 
type Select' (S n) (Array A ((:*:) t1 ts)) = Select' n (Array A ts)
type Discard' (S n) (Array A ((:*:) t1 ts)) # 
type Discard' (S n) (Array A ((:*:) t1 ts)) = Array A ((:*:) t1 (Discard' n ts))
type Mask' ((:*:) Drop ms) (Array A ((:*:) t1 ts)) # 
type Mask' ((:*:) Drop ms) (Array A ((:*:) t1 ts)) = Mask' ms (Array A ts)
type Mask' ((:*:) Keep ms) (Array A ((:*:) t1 ts)) # 
type Mask' ((:*:) Keep ms) (Array A ((:*:) t1 ts)) = Array A ((:*:) t1 (Mask' ms ts))

Date utils

rangeDate32 :: Date32 -> Date32 -> Array A Date32 Source #

Yield an array containing a range of dates, inclusive of the end points.