futhark-0.23.1: An optimising compiler for a functional, array-oriented language.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Futhark.CodeGen.ImpGen.GPU.Base

Synopsis

Documentation

data KernelConstants Source #

Constructors

KernelConstants 

Fields

data Locks Source #

Information about the locks available for accumulators.

Constructors

Locks 

data Target Source #

Which target are we ultimately generating code for? While most of the kernels code is the same, there are some cases where we generate special code based on the ultimate low-level API we are targeting.

Constructors

CUDA 
OpenCL 

groupLoop :: IntExp t => TExp t -> (TExp t -> InKernelGen ()) -> InKernelGen () Source #

Assign iterations of a for-loop to threads in the workgroup. The passed-in function is invoked with the (symbolic) iteration. For multidimensional loops, use groupCoverSpace.

data KernelAttrs Source #

Various extra configuration of the kernel being generated.

Constructors

KernelAttrs 

Fields

defKernelAttrs :: Count NumGroups SubExp -> Count GroupSize SubExp -> KernelAttrs Source #

The default kernel attributes.

lvlKernelAttrs :: SegLevel -> CallKernelGen KernelAttrs Source #

Compute kernel attributes from SegLevel; including synthesising group-size and thread count if no grid is provided.

virtualiseGroups :: SegVirt -> TExp Int32 -> (TExp Int32 -> InKernelGen ()) -> InKernelGen () Source #

For many kernels, we may not have enough physical groups to cover the logical iteration space. Some groups thus have to perform double duty; we put an outer loop to accomplish this. The advantage over just launching a bazillion threads is that the cost of memory expansion should be proportional to the number of *physical* threads (hardware parallelism), not the amount of application parallelism.

kernelLoop :: IntExp t => TExp t -> TExp t -> TExp t -> (TExp t -> InKernelGen ()) -> InKernelGen () Source #

Assign iterations of a for-loop to all threads in the kernel. The passed-in function is invoked with the (symbolic) iteration. The body must contain thread-level code. For multidimensional loops, use groupCoverSpace.

groupCoverSpace :: IntExp t => [TExp t] -> ([TExp t] -> InKernelGen ()) -> InKernelGen () Source #

Iterate collectively though a multidimensional space, such that all threads in the group participate. The passed-in function is invoked with a (symbolic) point in the index space.

fenceForArrays :: [VName] -> InKernelGen Fence Source #

If we are touching these arrays, which kind of fence do we need?

genZeroes :: String -> Int -> CallKernelGen VName Source #

Generate a constant device array of 32-bit integer zeroes with the given number of elements. Initialised with a replicate.

Host-level bulk operations

sReplicate :: VName -> SubExp -> CallKernelGen () Source #

Perform a Replicate with a kernel.

sIota :: VName -> TExp Int64 -> Exp -> Exp -> IntType -> CallKernelGen () Source #

Perform an Iota with a kernel.

sRotateKernel :: VName -> [TExp Int64] -> VName -> CallKernelGen () Source #

Perform a Rotate with a kernel.

sCopy :: VName -> TExp Int64 -> Space -> VName -> TExp Int64 -> Space -> Count Elements (TExp Int64) -> PrimType -> ImpM rep r op () Source #

Atomics

type AtomicBinOp = BinOp -> Maybe (VName -> VName -> Count Elements (TExp Int64) -> Exp -> AtomicOp) Source #

Is there an atomic BinOp corresponding to this BinOp?

atomicUpdateLocking :: AtomicBinOp -> Lambda GPUMem -> AtomicUpdate GPUMem KernelEnv Source #

Do an atomic update corresponding to a binary operator lambda.

data Locking Source #

Locking strategy used for an atomic update.

Constructors

Locking 

Fields

data AtomicUpdate rep r Source #

The mechanism that will be used for performing the atomic update. Approximates how efficient it will be. Ordered from most to least efficient.

Constructors

AtomicPrim (DoAtomicUpdate rep r)

Supported directly by primitive.

AtomicCAS (DoAtomicUpdate rep r)

Can be done by efficient swaps.

AtomicLocking (Locking -> DoAtomicUpdate rep r)

Requires explicit locking.

type DoAtomicUpdate rep r = Space -> [VName] -> [TExp Int64] -> ImpM rep r KernelOp () Source #

A function for generating code for an atomic update. Assumes that the bucket is in-bounds.