ghc-7.0.3: The GHC API

Vectorise.Builtins.Base

Contents

Description

Builtin types and functions used by the vectoriser. These are all defined in the DPH package.

Synopsis

Hard config

Builtins

data Builtins Source

Holds the names of the builtin types and functions used by the vectoriser.

Constructors

Builtins 

Fields

dphModules :: Modules
 
parrayTyCon :: TyCon

PArray

parrayDataCon :: DataCon

PArray

pdataTyCon :: TyCon

PData

paTyCon :: TyCon

PA

paDataCon :: DataCon

PA

preprTyCon :: TyCon

PRepr

prTyCon :: TyCon

PR

prDataCon :: DataCon

PR

replicatePDVar :: Var

replicatePD

emptyPDVar :: Var

emptyPD

packByTagPDVar :: Var

packByTagPD

combinePDVars :: Array Int Var

combinePD

scalarClass :: Class

Scalar

closureTyCon :: TyCon

:->

closureVar :: Var

closure

applyVar :: Var

$:

liftedClosureVar :: Var

liftedClosure

liftedApplyVar :: Var

liftedApply

closureCtrFuns :: Array Int Var

closure1 .. closure2

voidTyCon :: TyCon

Void

wrapTyCon :: TyCon

Wrap

sumTyCons :: Array Int TyCon

Sum2 .. Sum3

voidVar :: Var

void

pvoidVar :: Var

pvoid

fromVoidVar :: Var

fromVoid

punitVar :: Var

punit

selTys :: Array Int Type

Sel2

selReplicates :: Array Int CoreExpr

replicate2

selPicks :: Array Int CoreExpr

pick2

selTagss :: Array Int CoreExpr

tagsSel2

selEls :: Array (Int, Int) CoreExpr

elementsSel2_0 .. elementsSel_2_1

scalarZips :: Array Int Var

map, zipWith, zipWith3

liftingContext :: Var

lc

indexBuiltinSource

Arguments

:: (Ix i, Outputable i) 
=> String

Name of the selector we've used, for panic messages.

-> (Builtins -> Array i a)

Field selector for the Builtins.

-> i

Index into the array.

-> Builtins 
-> a 

Get an element from one of the arrays of contained by a Builtins. If the indexed thing is not in the array then panic.

Projections