feldspar-compiler-0.3.1: Compiler for the Feldspar languageSource codeContentsIndex
Feldspar.Compiler.Transformation.GraphToImperative
Documentation
graphToImperative :: HierarchicalGraph -> [Procedure InitSemInf]Source
data ProcedureSource Source
Constructors
ProcedureSource
interface :: Interface
hierarchy :: Hierarchy
class Collect t whereSource
Methods
collectSources :: t -> [ProcedureSource]Source
show/hide Instances
transformSourceToProcedure :: ProcedureSource -> Procedure InitSemInfSource
transformNodeToFormalParameter :: Node -> [FormalParameter InitSemInf]Source
transformNodeToLocalDeclaration :: Node -> [LocalDeclaration InitSemInf]Source
transformNodeListToFormalParameters :: [Node] -> [FormalParameter InitSemInf]Source
transformNodeListToLocalDeclarations :: [Node] -> [LocalDeclaration InitSemInf]Source
transformNodeToProgram :: (Node, [Hierarchy]) -> Program InitSemInfSource
transformNodeListToPrograms :: [(Node, [Hierarchy])] -> [Program InitSemInf]Source
varPrefix :: NodeId -> StringSource
varPath :: [Int] -> StringSource
varName :: NodeId -> [Int] -> StringSource
genVar :: NodeId -> [Int] -> Type -> Expression InitSemInfSource
outPrefix :: StringSource
outName :: [Int] -> StringSource
genOut :: [Int] -> Type -> Expression InitSemInfSource
passInArgs :: Tuple Source -> Tuple StorableType -> [ActualParameter InitSemInf]Source
passOutArgs :: NodeId -> Tuple StorableType -> [ActualParameter InitSemInf]Source
compileStorableType :: StorableType -> TypeSource
compilePrimitiveType :: PrimitiveType -> TypeSource
compileStorableDataToConst :: StorableData -> Constant InitSemInfSource
compilePrimDataToConst :: PrimitiveData -> Constant InitSemInfSource
compileStorableData :: StorableData -> StorableType -> Expression InitSemInfSource
compilePrimData :: PrimitiveData -> PrimitiveType -> Expression InitSemInfSource
transformSourceToExpr :: Source -> StorableType -> Expression InitSemInfSource
makeCopyFromIds :: (NodeId, [Int], StorableType) -> (NodeId, [Int], StorableType) -> Instruction InitSemInfSource
makeCopyFromExprs :: Expression InitSemInf -> Expression InitSemInf -> Instruction InitSemInfSource
copyNode :: NodeId -> NodeId -> Tuple StorableType -> Bool -> [Program InitSemInf]Source
copyResult :: Tuple Source -> NodeId -> Tuple StorableType -> Bool -> [Program InitSemInf]Source
copyToOutput :: Tuple Source -> Tuple StorableType -> Bool -> [Program InitSemInf]Source
varToExpr :: Variable InitSemInf -> Expression InitSemInfSource
Produced by Haddock version 2.6.1