feldspar-compiler-0.6.0.2: Compiler for the Feldspar language

Safe HaskellNone

Feldspar.Compiler.Backend.C.Plugin.PrettyPrint

Documentation

data DebugToCSemanticInfo Source

compToC :: ((Options, Place), Int) -> Module () -> (String, (Int, Int))Source

transform1' :: (Num t1, Transformable1 t5 [] s, Transformable t5 s, ~ * (Up t5) [Char], ~ * (Up t) [Char], ~ * (Down t5) (t2, t3, t4), ~ * (State t5) (t1, Int), ~ * (State t) (t1, Int), ~ * (To t) (To t5)) => t5 -> (t1, Int) -> (t2, t3, t4) -> [s (From t5)] -> [Char] -> t1 -> Result1 t [] sSource

transformConst :: (~ * (Label (To t3) Constant) ((Int, Int), (Int, Int)), ~ * (Label (To t3) IntConst) ((Int, Int), (Int, Int)), ~ * (Label (To t3) FloatConst) ((Int, Int), (Int, Int)), ~ * (Label (To t3) BoolConst) ((Int, Int), (Int, Int)), ~ * (Up t3) [Char], ~ * (State t3) (Int, Int)) => t -> (Int, Int) -> (Options, t1, t2) -> Constant () -> String -> Result t3 ConstantSource

transformActParam :: (Transformable t4 Expression, ~ * (Label (To t4) ActualParameter) ((Int, Int), (Int, Int)), ~ * (Up t4) [Char], ~ * (Up t1) [Char], ~ * (Down t4) (Options, t2, t3), ~ * (State t4) (Int, Int), ~ * (State t1) (Int, Int), ~ * (To t1) (To t4)) => t4 -> (Int, Int) -> (Options, t, t3) -> ActualParameter (From t4) -> t2 -> Result t1 ActualParameterSource

transformFuncCall :: (Transformable t4 Expression, ~ * (Label (To t4) Expression) ((Int, Int), (Int, Int)), ~ * (Label (To t4) FunctionCall) ((Int, Int), (Int, Int)), ~ * (Up t4) [Char], ~ * (Up t3) [Char], ~ * (Down t4) (t, t1, t2), ~ * (State t4) (Int, Int), ~ * (State t3) (Int, Int), ~ * (To t3) (To t4)) => t4 -> (Int, Int) -> (t, t1, t2) -> Expression (From t4) -> [Char] -> [Char] -> [Char] -> Result t3 ExpressionSource

code :: MonadState ([Char], Int, Int) m => [Char] -> m ()Source

indenter :: MonadState ([Char], t, t1) m => Int -> m ()Source

monadicTransform' :: (MonadState ([Char], Int, Int) m, Transformable t s, ~ * (Up t) [Char], ~ * (State t) (Int, Int)) => t -> Down t -> s (From t) -> m (Result t s)Source

complexTransform :: (MonadState (t, t2, t3) m, Transformable t1 s, ~ * (State t1) (t2, t3)) => t1 -> Down t1 -> s (From t1) -> m (Result t1 s)Source

monadicListTransform' :: (MonadState ([Char], Int, Int) m, Transformable1 t s a, ~ * (Up t) [Char], ~ * (State t) (Int, Int)) => t -> Down t -> s (a (From t)) -> m (Result1 t s a)Source