X-Git-Url: https://git.stderr.nl/gitweb?a=blobdiff_plain;f=c%CE%BBash%2FCLasH%2FTranslator.hs;h=8f2c7dc98d2b05e7bc7bd2ea6baa71a95cb7ac9f;hb=4ae6d0942205c704ef4c15a8ffd9398fd9f7ca53;hp=3911b4206f26cdcf31e8da4b8b1f199c37df71a3;hpb=034f715bdc540686ab63a77023223a08dc663039;p=matthijs%2Fmaster-project%2Fc%CE%BBash.git diff --git "a/c\316\273ash/CLasH/Translator.hs" "b/c\316\273ash/CLasH/Translator.hs" index 3911b42..8f2c7dc 100644 --- "a/c\316\273ash/CLasH/Translator.hs" +++ "b/c\316\273ash/CLasH/Translator.hs" @@ -1,90 +1,77 @@ -{-# LANGUAGE ScopedTypeVariables, RankNTypes, FlexibleContexts #-} +module CLasH.Translator + ( makeVHDLStrings + , makeVHDLAnnotations + ) where -module CLasH.Translator where - -import qualified Directory -import qualified System.FilePath as FilePath -import qualified List -import Debug.Trace -import qualified Control.Arrow as Arrow -import GHC hiding (loadModule, sigName) -import CoreSyn -import qualified CoreUtils -import qualified Var -import qualified Type -import qualified TyCon -import qualified DataCon -import qualified HscMain -import qualified SrcLoc -import qualified FastString +-- Standard Modules +import qualified System.Directory as Directory import qualified Maybe -import qualified Module -import qualified Data.Foldable as Foldable -import qualified Control.Monad.Trans.State as State -import qualified Control.Monad as Monad -import Name -import qualified Data.Map as Map -import Data.Accessor -import Data.Generics -import NameEnv ( lookupNameEnv ) +import qualified Monad +import qualified System.FilePath as FilePath +import Text.PrettyPrint.HughesPJ (render) + +-- GHC API +import qualified CoreSyn +import qualified GHC import qualified HscTypes -import HscTypes ( cm_binds, cm_types ) -import MonadUtils ( liftIO ) -import Outputable ( showSDoc, ppr, showSDocDebug ) -import DynFlags ( defaultDynFlags ) import qualified UniqSupply -import List ( find ) -import qualified List -import qualified Monad -import qualified Annotations -import qualified Serialized --- The following modules come from the ForSyDe project. They are really --- internal modules, so ForSyDe.cabal has to be modified prior to installing --- ForSyDe to get access to these modules. +-- VHDL Imports import qualified Language.VHDL.AST as AST import qualified Language.VHDL.FileIO import qualified Language.VHDL.Ppr as Ppr --- This is needed for rendering the pretty printed VHDL -import Text.PrettyPrint.HughesPJ (render) -import CLasH.Translator.TranslatorTypes -import CLasH.Translator.Annotations -import CLasH.Utils.Pretty +-- Local Imports import CLasH.Normalize -import CLasH.VHDL.VHDLTypes +import CLasH.Translator.Annotations import CLasH.Utils.Core.CoreTools -import qualified CLasH.VHDL as VHDL +import CLasH.Utils.GhcTools +import CLasH.VHDL --- | Turn Haskell to VHDL -makeVHDL :: - FilePath -- ^ The GHC Library Dir +-- | Turn Haskell to VHDL, Usings Strings to indicate the Top Entity, Initial +-- State and Test Inputs. +makeVHDLStrings :: + FilePath -- ^ The GHC Library Dir -> [FilePath] -- ^ The FileNames - -> String -- ^ The TopEntity - -> String -- ^ The InitState - -> String -- ^ The TestInput - -> Bool -- ^ Is It a stateful (in case InitState is not specified) + -> String -- ^ The TopEntity + -> String -- ^ The InitState + -> String -- ^ The TestInput + -> Bool -- ^ Is it stateful? (in case InitState is empty) -> IO () -makeVHDL libdir filenames topentity initstate testinput stateful = do - -- Load the modules - (core, top, init, test, env) <- loadModules libdir filenames (findBind topentity) (findBind initstate) (findExpr testinput) - -- Translate to VHDL - vhdl <- moduleToVHDL env core top init test stateful - -- Write VHDL to file - let top_entity = Maybe.fromJust $ head top - let dir = "./vhdl/" ++ (show top_entity) ++ "/" - prepareDir dir - mapM (writeVHDL dir) vhdl - return () - -makeVHDLAnn :: - FilePath -- ^ The GHC Library Dir +makeVHDLStrings libdir filenames topentity initstate testinput stateful = do + makeVHDL libdir filenames findTopEntity findInitState findTestInput stateful + where + findTopEntity = findBind (hasVarName topentity) + findInitState = findBind (hasVarName initstate) + findTestInput = findExpr (hasVarName testinput) + +-- | Turn Haskell to VHDL, Using the Annotations for Top Entity, Initial State +-- and Test Inputs found in the Files. +makeVHDLAnnotations :: + FilePath -- ^ The GHC Library Dir -> [FilePath] -- ^ The FileNames - -> Bool -- ^ Is It a stateful (in case InitState is not specified) + -> Bool -- ^ Is it stateful? (in case InitState is not specified) + -> IO () +makeVHDLAnnotations libdir filenames stateful = do + makeVHDL libdir filenames findTopEntity findInitState findTestInput stateful + where + findTopEntity = findBind (hasCLasHAnnotation isTopEntity) + findInitState = findBind (hasCLasHAnnotation isInitState) + findTestInput = findExpr (hasCLasHAnnotation isTestInput) + +-- | Turn Haskell to VHDL, using the given finder functions to find the Top +-- Entity, Initial State and Test Inputs in the Haskell Files. +makeVHDL :: + FilePath -- ^ The GHC Library Dir + -> [FilePath] -- ^ The Filenames + -> (HscTypes.CoreModule -> GHC.Ghc (Maybe CoreSyn.CoreBndr)) -- ^ The Top Entity Finder + -> (HscTypes.CoreModule -> GHC.Ghc (Maybe CoreSyn.CoreBndr)) -- ^ The Init State Finder + -> (HscTypes.CoreModule -> GHC.Ghc (Maybe CoreSyn.CoreExpr)) -- ^ The Test Input Finder + -> Bool -- ^ Indicates if it is meant to be stateful -> IO () -makeVHDLAnn libdir filenames stateful = do +makeVHDL libdir filenames topEntFinder initStateFinder testInputFinder stateful = do -- Load the modules - (cores, top, init, test, env) <- loadModules libdir filenames findTopEntity findInitState findTestInput + (cores, top, init, test, env) <- loadModules libdir filenames topEntFinder initStateFinder testInputFinder -- Translate to VHDL vhdl <- moduleToVHDL env cores top init test stateful -- Write VHDL to file @@ -93,21 +80,17 @@ makeVHDLAnn libdir filenames stateful = do prepareDir dir mapM (writeVHDL dir) vhdl return () - where - findTopEntity = findBindAnn (hasCLasHAnnotation isTopEntity) - findInitState = findBindAnn (hasCLasHAnnotation isInitState) - findTestInput = findExprAnn (hasCLasHAnnotation isTestInput) -- | Translate the binds with the given names from the given core module to -- VHDL. The Bool in the tuple makes the function stateful (True) or -- stateless (False). moduleToVHDL :: - HscTypes.HscEnv -- ^ The GHC Environment - -> [HscTypes.CoreModule] -- ^ The Core Modules - -> [Maybe CoreBndr] -- ^ The TopEntity - -> [Maybe CoreBndr] -- ^ The InitState - -> [Maybe CoreExpr] -- ^ The TestInput - -> Bool -- ^ Is it stateful (in case InitState is not specified) + HscTypes.HscEnv -- ^ The GHC Environment + -> [HscTypes.CoreModule] -- ^ The Core Modules + -> [Maybe CoreSyn.CoreBndr] -- ^ The TopEntity + -> [Maybe CoreSyn.CoreBndr] -- ^ The InitState + -> [Maybe CoreSyn.CoreExpr] -- ^ The TestInput + -> Bool -- ^ Is it stateful (in case InitState is not specified) -> IO [(AST.VHDLId, AST.DesignFile)] moduleToVHDL env cores top init test stateful = do let topEntity = Maybe.catMaybes top @@ -118,10 +101,10 @@ moduleToVHDL env cores top init test stateful = do let isStateful = not (null initialState) || stateful let testInput = Maybe.catMaybes test uniqSupply <- UniqSupply.mkSplitUniqSupply 'z' - let all_bindings = concat (map (\x -> CoreSyn.flattenBinds (cm_binds x)) cores) + let all_bindings = concat (map (\x -> CoreSyn.flattenBinds (HscTypes.cm_binds x)) cores) let testexprs = case testInput of [] -> [] ; [x] -> reduceCoreListToHsList x let (normalized_bindings, test_bindings, typestate) = normalizeModule env uniqSupply all_bindings testexprs [topEnt] [isStateful] - let vhdl = VHDL.createDesignFiles typestate normalized_bindings topEnt test_bindings + let vhdl = createDesignFiles typestate normalized_bindings topEnt test_bindings mapM (putStr . render . Ppr.ppr . snd) vhdl return vhdl xs -> error "More than one topentity found" @@ -131,8 +114,7 @@ moduleToVHDL env cores top init test stateful = do prepareDir :: String -> IO() prepareDir dir = do -- Create the dir if needed - exists <- Directory.doesDirectoryExist dir - Monad.unless exists $ Directory.createDirectory dir + Directory.createDirectoryIfMissing True dir -- Find all .vhdl files in the directory files <- Directory.getDirectoryContents dir let to_remove = filter ((==".vhdl") . FilePath.takeExtension) files @@ -150,95 +132,4 @@ writeVHDL dir (name, vhdl) = do -- Write the file Language.VHDL.FileIO.writeDesignFile vhdl fname --- | Loads the given files and turns it into a core module -loadModules :: - FilePath -- ^ The GHC Library directory - -> [String] -- ^ The files that need to be loaded - -> (HscTypes.CoreModule -> Ghc (Maybe CoreBndr)) -- ^ The TopEntity finder - -> (HscTypes.CoreModule -> Ghc (Maybe CoreBndr)) -- ^ The InitState finder - -> (HscTypes.CoreModule -> Ghc (Maybe CoreExpr)) -- ^ The TestInput finder - -> IO ( [HscTypes.CoreModule] -- The loaded modules - , [Maybe CoreBndr] -- The TopEntity - , [Maybe CoreBndr] -- The InitState - , [Maybe CoreExpr] -- The TestInput - , HscTypes.HscEnv -- The Environment corresponding ot the loaded modules - ) -loadModules libdir filenames topEntLoc initSLoc testLoc = - defaultErrorHandler defaultDynFlags $ do - runGhc (Just libdir) $ do - dflags <- getSessionDynFlags - setSessionDynFlags dflags - cores <- mapM GHC.compileToCoreModule filenames - env <- GHC.getSession - top_entity <- mapM topEntLoc cores - init_state <- mapM initSLoc cores - test_input <- mapM testLoc cores - return (cores, top_entity, init_state, test_input, env) - -findBindAnn :: - GhcMonad m => - (Var.Var -> m Bool) - -> HscTypes.CoreModule - -> m (Maybe CoreBndr) -findBindAnn annotation core = do - let binds = CoreSyn.flattenBinds $ cm_binds core - annbinds <- Monad.filterM (annotation . fst) binds - let bndr = case annbinds of [] -> Nothing ; xs -> Just $ head $ fst (unzip annbinds) - return bndr - -findExprAnn :: - GhcMonad m => - (Var.Var -> m Bool) - -> HscTypes.CoreModule - -> m (Maybe CoreExpr) -findExprAnn annotation core = do - let binds = CoreSyn.flattenBinds $ cm_binds core - annbinds <- Monad.filterM (annotation . fst) binds - let exprs = case annbinds of [] -> Nothing ; xs -> Just $ head $ snd (unzip annbinds) - return exprs - -hasCLasHAnnotation :: - GhcMonad m => - (CLasHAnn -> Bool) - -> Var.Var - -> m Bool -hasCLasHAnnotation clashAnn var = do - let deserializer = Serialized.deserializeWithData - let target = Annotations.NamedTarget (Var.varName var) - (anns :: [CLasHAnn]) <- GHC.findGlobalAnns deserializer target - let top_ents = filter clashAnn anns - case top_ents of - [] -> return False - xs -> return True - --- | Extracts the named binder from the given module. -findBind :: - GhcMonad m => - String -- ^ The Name of the Binder - -> HscTypes.CoreModule -- ^ The Module to look in - -> m (Maybe CoreBndr) -- ^ The resulting binder -findBind name core = - case (findBinder (CoreSyn.flattenBinds $ cm_binds core)) name of - Nothing -> return Nothing - Just bndr -> return $ Just $ fst bndr - --- | Extracts the named expression from the given module. -findExpr :: - GhcMonad m => - String -- ^ The Name of the Binder - -> HscTypes.CoreModule -- ^ The Module to look in - -> m (Maybe CoreExpr) -- ^ The resulting expression -findExpr name core = - case (findBinder (CoreSyn.flattenBinds $ cm_binds core)) name of - Nothing -> return Nothing - Just bndr -> return $ Just $ snd bndr - --- | Extract a named bind from the given list of binds -findBinder :: [(CoreBndr, CoreExpr)] -> String -> Maybe (CoreBndr, CoreExpr) -findBinder binds lookfor = - -- This ignores Recs and compares the name of the bind with lookfor, - -- disregarding any namespaces in OccName and extra attributes in Name and - -- Var. - find (\(var, _) -> lookfor == (occNameString $ nameOccName $ getName var)) binds - -- vim: set ts=8 sw=2 sts=2 expandtab: