[project @ 2005-05-17 07:48:20 by simonmar]
[ghc-hetmet.git] / ghc / compiler / main / GHC.hs
index 67dd723..8dd1950 100644 (file)
@@ -23,7 +23,7 @@ module GHC (
        setMsgHandler,
 
        -- * Targets
-       Target(..), TargetId(..),
+       Target(..), TargetId(..), Phase,
        setTargets,
        getTargets,
        addTarget,
@@ -51,6 +51,8 @@ module GHC (
        modInfoTopLevelScope,
        modInfoPrintUnqualified,
        modInfoExports,
+       modInfoIsExportedName,
+       modInfoLookupName,
        lookupGlobalName,
 
        -- * Interactive evaluation
@@ -77,7 +79,7 @@ module GHC (
        Module, mkModule, pprModule,
 
        -- ** Names
-       Name,
+       Name, nameModule,
        
        -- ** Identifiers
        Id, idType,
@@ -149,7 +151,7 @@ import Bag          ( unitBag, emptyBag )
 #endif
 
 import Packages                ( initPackages )
-import NameSet         ( NameSet, nameSetToList )
+import NameSet         ( NameSet, nameSetToList, elemNameSet )
 import RdrName         ( GlobalRdrEnv, GlobalRdrElt(..), RdrName, gre_name,
                          globalRdrEnvElts )
 import HsSyn
@@ -163,7 +165,7 @@ import Id           ( Id, idType, isImplicitId, isDeadBinder,
 import TyCon           ( TyCon, isClassTyCon, isSynTyCon, isNewTyCon )
 import Class           ( Class, classSCTheta, classTvsFds )
 import DataCon         ( DataCon )
-import Name            ( Name )
+import Name            ( Name, nameModule )
 import NameEnv         ( nameEnvElts )
 import SrcLoc          ( Located(..) )
 import DriverPipeline
@@ -351,19 +353,25 @@ removeTarget s target_id
 --       then use that
 --     - otherwise interpret the string as a module name
 --
-guessTarget :: String -> IO Target
-guessTarget file
+guessTarget :: String -> Maybe Phase -> IO Target
+guessTarget file (Just phase)
+   = return (Target (TargetFile file (Just phase)) Nothing)
+guessTarget file Nothing
    | isHaskellSrcFilename file
-   = return (Target (TargetFile file) Nothing)
+   = return (Target (TargetFile file Nothing) Nothing)
    | otherwise
    = do exists <- doesFileExist hs_file
-       if exists then return (Target (TargetFile hs_file) Nothing) else do
+       if exists
+          then return (Target (TargetFile hs_file Nothing) Nothing)
+          else do
        exists <- doesFileExist lhs_file
-       if exists then return (Target (TargetFile lhs_file) Nothing) else do
+       if exists
+          then return (Target (TargetFile lhs_file Nothing) Nothing)
+          else do
        return (Target (TargetModule (mkModule file)) Nothing)
      where 
-        hs_file = file ++ ".hs"
-        lhs_file = file ++ ".lhs"
+        hs_file  = file `joinFileExt` "hs"
+        lhs_file = file `joinFileExt` "lhs"
 
 -- -----------------------------------------------------------------------------
 -- Loading the program
@@ -1210,12 +1218,14 @@ downsweep hsc_env old_summaries excl_mods
        old_summary_map = mkNodeMap old_summaries
 
        getRootSummary :: Target -> IO ModSummary
-       getRootSummary (Target (TargetFile file) maybe_buf)
+       getRootSummary (Target (TargetFile file mb_phase) maybe_buf)
           = do exists <- doesFileExist file
-               if exists then summariseFile hsc_env file maybe_buf else do
+               if exists 
+                   then summariseFile hsc_env old_summaries file mb_phase maybe_buf
+                   else do
                throwDyn (CmdLineError ("can't find file: " ++ file))   
        getRootSummary (Target (TargetModule modl) maybe_buf)
-          = do maybe_summary <- summarise hsc_env emptyNodeMap Nothing False 
+          = do maybe_summary <- summariseModule hsc_env old_summary_map Nothing False 
                                           modl maybe_buf excl_mods
                case maybe_summary of
                   Nothing -> packageModErr modl
@@ -1247,7 +1257,7 @@ downsweep hsc_env old_summaries excl_mods
        loop [] done      = return (nodeMapElts done)
        loop ((cur_path, wanted_mod, is_boot) : ss) done 
          | key `elemFM` done = loop ss done
-         | otherwise         = do { mb_s <- summarise hsc_env old_summary_map 
+         | otherwise         = do { mb_s <- summariseModule hsc_env old_summary_map 
                                                 (Just cur_path) is_boot 
                                                 wanted_mod Nothing excl_mods
                                   ; case mb_s of
@@ -1287,17 +1297,42 @@ msDeps s =  concat [ [(f, m, True), (f,m,False)] | m <- ms_srcimps s]
 --     a summary.  The finder is used to locate the file in which the module
 --     resides.
 
-summariseFile :: HscEnv -> FilePath
-   -> Maybe (StringBuffer,ClockTime)
-   -> IO ModSummary
--- Used for Haskell source only, I think
--- We know the file name, and we know it exists,
--- but we don't necessarily know the module name (might differ)
-summariseFile hsc_env file maybe_buf
-   = do let dflags = hsc_dflags hsc_env
+summariseFile
+       :: HscEnv
+       -> [ModSummary]                 -- old summaries
+       -> FilePath                     -- source file name
+       -> Maybe Phase                  -- start phase
+       -> Maybe (StringBuffer,ClockTime)
+       -> IO ModSummary
+
+summariseFile hsc_env old_summaries file mb_phase maybe_buf
+       -- we can use a cached summary if one is available and the
+       -- source file hasn't changed,  But we have to look up the summary
+       -- by source file, rather than module name as we do in summarise.
+   | Just old_summary <- findSummaryBySourceFile old_summaries file
+   = do
+       let location = ms_location old_summary
+
+               -- return the cached summary if the source didn't change
+       src_timestamp <- case maybe_buf of
+                          Just (_,t) -> return t
+                          Nothing    -> getModificationTime file
+
+       if ms_hs_date old_summary == src_timestamp 
+          then do -- update the object-file timestamp
+                 obj_timestamp <- getObjTimestamp location False
+                 return old_summary{ ms_obj_date = obj_timestamp }
+          else
+               new_summary
+
+   | otherwise
+   = new_summary
+  where
+    new_summary = do
+       let dflags = hsc_dflags hsc_env
 
        (dflags', hspp_fn, buf)
-           <- preprocessFile dflags file maybe_buf
+           <- preprocessFile dflags file mb_phase maybe_buf
 
         (srcimps,the_imps,mod) <- getImports dflags' buf hspp_fn
 
@@ -1322,8 +1357,16 @@ summariseFile hsc_env file maybe_buf
                             ms_hs_date = src_timestamp,
                             ms_obj_date = obj_timestamp })
 
+findSummaryBySourceFile :: [ModSummary] -> FilePath -> Maybe ModSummary
+findSummaryBySourceFile summaries file
+  = case [ ms | ms <- summaries, HsSrcFile <- [ms_hsc_src ms],
+                                fromJust (ml_hs_file (ms_location ms)) == file ] of
+       [] -> Nothing
+       (x:xs) -> Just x
+
 -- Summarise a module, and pick up source and timestamp.
-summarise :: HscEnv
+summariseModule
+         :: HscEnv
          -> NodeMap ModSummary -- Map of old summaries
          -> Maybe FilePath     -- Importing module (for error messages)
          -> IsBootInterface    -- True <=> a {-# SOURCE #-} import
@@ -1332,7 +1375,7 @@ summarise :: HscEnv
          -> [Module]           -- Modules to exclude
          -> IO (Maybe ModSummary)      -- Its new summary
 
-summarise hsc_env old_summary_map cur_mod is_boot wanted_mod maybe_buf excl_mods
+summariseModule hsc_env old_summary_map cur_mod is_boot wanted_mod maybe_buf excl_mods
   | wanted_mod `elem` excl_mods
   = return Nothing
 
@@ -1340,7 +1383,7 @@ summarise hsc_env old_summary_map cur_mod is_boot wanted_mod maybe_buf excl_mods
   = do         -- Find its new timestamp; all the 
                -- ModSummaries in the old map have valid ml_hs_files
        let location = ms_location old_summary
-           src_fn = expectJust "summarise" (ml_hs_file location)
+           src_fn = expectJust "summariseModule" (ml_hs_file location)
 
                -- return the cached summary if the source didn't change
        src_timestamp <- case maybe_buf of
@@ -1389,7 +1432,7 @@ summarise hsc_env old_summary_map cur_mod is_boot wanted_mod maybe_buf excl_mods
       = do
        -- Preprocess the source file and get its imports
        -- The dflags' contains the OPTIONS pragmas
-       (dflags', hspp_fn, buf) <- preprocessFile dflags src_fn maybe_buf
+       (dflags', hspp_fn, buf) <- preprocessFile dflags src_fn Nothing maybe_buf
         (srcimps, the_imps, mod_name) <- getImports dflags' buf hspp_fn
 
        when (mod_name /= wanted_mod) $
@@ -1417,15 +1460,15 @@ getObjTimestamp location is_boot
               else modificationTimeIfExists (ml_obj_file location)
 
 
-preprocessFile :: DynFlags -> FilePath -> Maybe (StringBuffer,ClockTime)
+preprocessFile :: DynFlags -> FilePath -> Maybe Phase -> Maybe (StringBuffer,ClockTime)
   -> IO (DynFlags, FilePath, StringBuffer)
-preprocessFile dflags src_fn Nothing
+preprocessFile dflags src_fn mb_phase Nothing
   = do
-       (dflags', hspp_fn) <- preprocess dflags src_fn
+       (dflags', hspp_fn) <- preprocess dflags (src_fn, mb_phase)
        buf <- hGetStringBuffer hspp_fn
        return (dflags', hspp_fn, buf)
 
-preprocessFile dflags src_fn (Just (buf, time))
+preprocessFile dflags src_fn mb_phase (Just (buf, time))
   = do
        -- case we bypass the preprocessing stage?
        let 
@@ -1435,7 +1478,8 @@ preprocessFile dflags src_fn (Just (buf, time))
 
        let
            needs_preprocessing
-               | Unlit _ <- startPhase src_fn  = True
+               | Just (Unlit _) <- mb_phase    = True
+               | Nothing <- mb_phase, Unlit _ <- startPhase src_fn  = True
                  -- note: local_opts is only required if there's no Unlit phase
                | dopt Opt_Cpp dflags'          = True
                | dopt Opt_Pp  dflags'          = True
@@ -1573,9 +1617,20 @@ modInfoTopLevelScope minf
 modInfoExports :: ModuleInfo -> [Name]
 modInfoExports minf = nameSetToList $! minf_exports minf
 
+modInfoIsExportedName :: ModuleInfo -> Name -> Bool
+modInfoIsExportedName minf name = elemNameSet name (minf_exports minf)
+
 modInfoPrintUnqualified :: ModuleInfo -> Maybe PrintUnqualified
 modInfoPrintUnqualified minf = fmap unQualInScope (minf_rdr_env minf)
 
+modInfoLookupName :: Session -> ModuleInfo -> Name -> IO (Maybe TyThing)
+modInfoLookupName s minf name = withSession s $ \hsc_env -> do
+   case lookupTypeEnv (minf_type_env minf) name of
+     Just tyThing -> return (Just tyThing)
+     Nothing      -> do
+       eps <- readIORef (hsc_EPS hsc_env)
+       return $! lookupType (hsc_HPT hsc_env) (eps_PTE eps) name
+
 isDictonaryId :: Id -> Bool
 isDictonaryId id
   = case tcSplitSigmaTy (idType id) of { (tvs, theta, tau) -> isDictTy tau }