module IRTS.CodegenCommon where
import Idris.Core.TT
import IRTS.Simplified
import IRTS.Defunctionalise
import IRTS.Lang
import Control.Exception
import Data.Word
import System.Environment
data DbgLevel = NONE | DEBUG | TRACE deriving Eq
data OutputType = Raw | Object | Executable | MavenProject deriving (Eq, Show)
environment :: String -> IO (Maybe String)
environment x = Control.Exception.catch (do e <- getEnv x
return (Just e))
(\y-> do return (y::SomeException); return Nothing)
data CodegenInfo = CodegenInfo { outputFile :: String,
outputType :: OutputType,
targetTriple :: String,
targetCPU :: String,
includes :: [FilePath],
importDirs :: [FilePath],
compileObjs :: [String],
compileLibs :: [String],
compilerFlags :: [String],
debugLevel :: DbgLevel,
simpleDecls :: [(Name, SDecl)],
defunDecls :: [(Name, DDecl)],
liftDecls :: [(Name, LDecl)],
interfaces :: Bool,
exportDecls :: [ExportIFace]
}
type CodeGenerator = CodegenInfo -> IO ()