feldspar-compiler-0.1: Compiler for the Feldspar languageSource codeContentsIndex
Feldspar.Compiler.Transformation.GraphToImperative
Documentation
graphToImperative :: String -> HierarchicalGraph -> [ImpFunction]Source
data ImpFunctionSource Source
Constructors
ImpFunctionSource
functionName :: String
interface :: Interface
hierarchy :: Hierarchy
show/hide Instances
class Collect t whereSource
Methods
collectSources :: t -> [ImpFunctionSource]Source
show/hide Instances
transformSourceToImpFunction :: ImpFunctionSource -> ImpFunctionSource
transformNodeToDeclaration :: Node -> [Declaration]Source
transformNodeListToDeclarations :: [Node] -> [Declaration]Source
transformNodeToProgram :: (Node, [Hierarchy]) -> ProgramSource
transformNodeListToPrograms :: [(Node, [Hierarchy])] -> [Program]Source
varPrefix :: NodeId -> StringSource
varPath :: [Int] -> StringSource
varName :: NodeId -> [Int] -> StringSource
genVar :: NodeId -> [Int] -> Type -> UntypedExpressionSource
outPrefix :: StringSource
outName :: [Int] -> StringSource
genOut :: [Int] -> Type -> UntypedExpressionSource
passInArgs :: Tuple Source -> Tuple StorableType -> [Parameter]Source
passOutArgs :: NodeId -> Tuple StorableType -> [Parameter]Source
compileStorableType :: StorableType -> TypeSource
compilePrimitiveType :: PrimitiveType -> TypeSource
compileStorableDataToConst :: StorableData -> ConstantSource
compilePrimDataToConst :: PrimitiveData -> ConstantSource
compileStorableData :: StorableData -> StorableType -> ImpLangExprSource
compilePrimData :: PrimitiveData -> PrimitiveType -> ImpLangExprSource
transformSourceToExpr :: Source -> StorableType -> ImpLangExprSource
makeCopyFromIds :: (NodeId, [Int], StorableType) -> (NodeId, [Int], StorableType) -> InstructionSource
makeCopyFromExprs :: ImpLangExpr -> ImpLangExpr -> InstructionSource
copyNode :: NodeId -> NodeId -> Tuple StorableType -> Bool -> [Program]Source
copyResult :: Tuple Source -> NodeId -> Tuple StorableType -> Bool -> [Program]Source
copyToOutput :: Tuple Source -> Tuple StorableType -> Bool -> [Program]Source
Produced by Haddock version 2.6.0