X-Git-Url: http://git.megacz.com/?p=ghc-hetmet.git;a=blobdiff_plain;f=compiler%2Fmain%2FDriverPipeline.hs;h=16a172598351af288384511ed61ff21e0f9b0c8a;hp=a39ca38a994878b1ac0f38434ffef284e8cbaacf;hb=b1ab4b8a607addc4d097588db5761313c996a41f;hpb=dda45b7ae83033cf99630435c13054f3f6ac67d2 diff --git a/compiler/main/DriverPipeline.hs b/compiler/main/DriverPipeline.hs index a39ca38..16a1725 100644 --- a/compiler/main/DriverPipeline.hs +++ b/compiler/main/DriverPipeline.hs @@ -29,13 +29,13 @@ module DriverPipeline ( import Packages import HeaderInfo import DriverPhases -import SysTools ( newTempName, addFilesToClean, getSysMan, copy ) -import qualified SysTools +import SysTools import HscMain import Finder import HscTypes import Outputable import Module +import UniqFM ( eltsUFM ) import ErrUtils import DynFlags import StaticFlags ( v_Ld_inputs, opt_Static, WayName(..) ) @@ -49,17 +49,17 @@ import ParserCoreUtils ( getCoreModuleName ) import SrcLoc ( unLoc ) import SrcLoc ( Located(..) ) -import EXCEPTION -import DATA_IOREF ( readIORef, writeIORef, IORef ) -import GLAEXTS ( Int(..) ) - -import Directory -import System -import IO -import Monad +import Control.Exception as Exception +import Data.IORef ( readIORef, writeIORef, IORef ) +import GHC.Exts ( Int(..) ) +import System.Directory +import System.IO +import SYSTEM_IO_ERROR as IO +import Control.Monad import Data.List ( isSuffixOf ) -import Maybe - +import Data.Maybe +import System.Exit +import System.Environment -- --------------------------------------------------------------------------- -- Pre-process @@ -73,7 +73,8 @@ import Maybe preprocess :: DynFlags -> (FilePath, Maybe Phase) -> IO (DynFlags, FilePath) preprocess dflags (filename, mb_phase) = ASSERT2(isJust mb_phase || isHaskellSrcFilename filename, text filename) - runPipeline anyHsc dflags (filename, mb_phase) Temporary Nothing{-no ModLocation-} + runPipeline anyHsc dflags (filename, mb_phase) + Nothing Temporary Nothing{-no ModLocation-} -- --------------------------------------------------------------------------- -- Compile @@ -135,16 +136,16 @@ compile hsc_env mod_summary maybe_old_linkable old_iface mod_index nmods = do -- ... and what the next phase should be let next_phase = hscNextPhase dflags src_flavour hsc_lang -- ... and what file to generate the output into - output_fn <- getOutputFilename dflags next_phase - Temporary basename next_phase (Just location) + output_fn <- getOutputFilename next_phase + Temporary basename dflags next_phase (Just location) let dflags' = dflags { hscTarget = hsc_lang, hscOutName = output_fn, extCoreName = basename ++ ".hcr" } -- -no-recomp should also work with --make - let do_recomp = dopt Opt_RecompChecking dflags - source_unchanged = isJust maybe_old_linkable && do_recomp + let force_recomp = dopt Opt_ForceRecomp dflags + source_unchanged = isJust maybe_old_linkable && not force_recomp hsc_env' = hsc_env { hsc_dflags = dflags' } object_filename = ml_obj_file location @@ -167,7 +168,9 @@ compile hsc_env mod_summary maybe_old_linkable old_iface mod_index nmods = do -> return ([], ms_hs_date mod_summary) -- We're in --make mode: finish the compilation pipeline. _other - -> do runPipeline StopLn dflags (output_fn,Nothing) Persistent + -> do runPipeline StopLn dflags (output_fn,Nothing) + (Just basename) + Persistent (Just location) -- The object filename comes from the ModLocation o_time <- getModificationTime object_filename @@ -235,8 +238,8 @@ compileStub dflags mod location = do stub_o = o_base ++ "_stub" `joinFileExt` o_ext -- compile the _stub.c file w/ gcc - let (stub_c,_) = mkStubPaths dflags mod location - runPipeline StopLn dflags (stub_c,Nothing) + let (stub_c,_) = mkStubPaths dflags (moduleName mod) location + runPipeline StopLn dflags (stub_c,Nothing) Nothing (SpecificFile stub_o) Nothing{-no ModLocation-} return stub_o @@ -245,7 +248,7 @@ compileStub dflags mod location = do -- --------------------------------------------------------------------------- -- Link -link :: GhcMode -- interactive or batch +link :: GhcLink -- interactive or batch -> DynFlags -- dynamic flags -> Bool -- attempt linking in batch mode? -> HomePackageTable -- what to link @@ -259,19 +262,19 @@ link :: GhcMode -- interactive or batch -- will succeed. #ifdef GHCI -link Interactive dflags batch_attempt_linking hpt +link LinkInMemory dflags batch_attempt_linking hpt = do -- Not Linking...(demand linker will do the job) return Succeeded #endif -link JustTypecheck dflags batch_attempt_linking hpt +link NoLink dflags batch_attempt_linking hpt = return Succeeded -link BatchCompile dflags batch_attempt_linking hpt +link LinkBinary dflags batch_attempt_linking hpt | batch_attempt_linking = do let - home_mod_infos = moduleEnvElts hpt + home_mod_infos = eltsUFM hpt -- the packages we depend on pkg_deps = concatMap (dep_pkgs . mi_deps . hm_iface) home_mod_infos @@ -301,7 +304,7 @@ link BatchCompile dflags batch_attempt_linking hpt | Right t <- e_exe_time = any (t <) (map linkableTime linkables) - if dopt Opt_RecompChecking dflags && not linking_needed + if not (dopt Opt_ForceRecomp dflags) && not linking_needed then do debugTraceMsg dflags 2 (text exe_file <+> ptext SLIT("is up to date, linking not required.")) return Succeeded else do @@ -312,7 +315,7 @@ link BatchCompile dflags batch_attempt_linking hpt -- Don't showPass in Batch mode; doLink will do that for us. let link = case ghcLink dflags of MkDLL -> doMkDLL - StaticLink -> staticLink + LinkBinary -> staticLink link dflags obj_files pkg_deps debugTraceMsg dflags 3 (text "link: done") @@ -359,7 +362,8 @@ compileFile dflags stop_phase (src, mb_phase) = do other -> stop_phase (_, out_file) <- runPipeline stop_phase' dflags - (src, mb_phase) output Nothing{-no ModLocation-} + (src, mb_phase) Nothing output + Nothing{-no ModLocation-} return out_file @@ -371,14 +375,12 @@ doLink dflags stop_phase o_files | otherwise = case ghcLink dflags of NoLink -> return () - StaticLink -> staticLink dflags o_files link_pkgs + LinkBinary -> staticLink dflags o_files link_pkgs MkDLL -> doMkDLL dflags o_files link_pkgs where -- Always link in the haskell98 package for static linking. Other -- packages have to be specified via the -package flag. - link_pkgs - | ExtPackage h98_id <- haskell98PackageId (pkgState dflags) = [h98_id] - | otherwise = [] + link_pkgs = [haskell98PackageId] -- --------------------------------------------------------------------------- @@ -407,18 +409,19 @@ runPipeline :: Phase -- When to stop -> DynFlags -- Dynamic flags -> (FilePath,Maybe Phase) -- Input filename (and maybe -x suffix) + -> Maybe FilePath -- original basename (if different from ^^^) -> PipelineOutput -- Output filename -> Maybe ModLocation -- A ModLocation, if this is a Haskell module -> IO (DynFlags, FilePath) -- (final flags, output filename) -runPipeline stop_phase dflags (input_fn, mb_phase) output maybe_loc +runPipeline stop_phase dflags (input_fn, mb_phase) mb_basename output maybe_loc = do - let (basename, suffix) = splitFilename input_fn + let (input_basename, suffix) = splitFilename input_fn + basename | Just b <- mb_basename = b + | otherwise = input_basename -- If we were given a -x flag, then use that phase to start from - start_phase - | Just x_phase <- mb_phase = x_phase - | otherwise = startPhase suffix + start_phase = fromMaybe (startPhase suffix) mb_phase -- We want to catch cases of "you can't get there from here" before -- we start the pipeline, because otherwise it will just run off the @@ -434,7 +437,7 @@ runPipeline stop_phase dflags (input_fn, mb_phase) output maybe_loc -- this is a function which will be used to calculate output file names -- as we go along (we partially apply it to some of its inputs here) - let get_output_fn = getOutputFilename dflags stop_phase output basename + let get_output_fn = getOutputFilename stop_phase output basename -- Execute the pipeline... (dflags', output_fn, maybe_loc) <- @@ -444,22 +447,24 @@ runPipeline stop_phase dflags (input_fn, mb_phase) output maybe_loc -- Sometimes, a compilation phase doesn't actually generate any output -- (eg. the CPP phase when -fcpp is not turned on). If we end on this -- stage, but we wanted to keep the output, then we have to explicitly - -- copy the file. + -- copy the file, remembering to prepend a {-# LINE #-} pragma so that + -- further compilation stages can tell what the original filename was. case output of Temporary -> return (dflags', output_fn) _other -> - do final_fn <- get_output_fn stop_phase maybe_loc - when (final_fn /= output_fn) $ - copy dflags ("Copying `" ++ output_fn ++ "' to `" ++ final_fn - ++ "'") output_fn final_fn + do final_fn <- get_output_fn dflags' stop_phase maybe_loc + when (final_fn /= output_fn) $ do + let msg = ("Copying `" ++ output_fn ++"' to `" ++ final_fn ++ "'") + line_prag = Just ("{-# LINE 1 \"" ++ input_fn ++ "\" #-}\n") + copyWithHeader dflags msg line_prag output_fn final_fn return (dflags', final_fn) - + pipeLoop :: DynFlags -> Phase -> Phase -> FilePath -> String -> Suffix - -> (Phase -> Maybe ModLocation -> IO FilePath) + -> (DynFlags -> Phase -> Maybe ModLocation -> IO FilePath) -> Maybe ModLocation -> IO (DynFlags, FilePath, Maybe ModLocation) @@ -486,28 +491,28 @@ pipeLoop dflags phase stop_phase orig_basename orig_suff orig_get_output_fn maybe_loc } getOutputFilename - :: DynFlags -> Phase -> PipelineOutput -> String - -> Phase{-next phase-} -> Maybe ModLocation -> IO FilePath -getOutputFilename dflags stop_phase output basename + :: Phase -> PipelineOutput -> String + -> DynFlags -> Phase{-next phase-} -> Maybe ModLocation -> IO FilePath +getOutputFilename stop_phase output basename = func where - hcsuf = hcSuf dflags - odir = objectDir dflags - osuf = objectSuf dflags - keep_hc = dopt Opt_KeepHcFiles dflags - keep_raw_s = dopt Opt_KeepRawSFiles dflags - keep_s = dopt Opt_KeepSFiles dflags - - myPhaseInputExt HCc = hcsuf - myPhaseInputExt StopLn = osuf - myPhaseInputExt other = phaseInputExt other - - func next_phase maybe_location + func dflags next_phase maybe_location | is_last_phase, Persistent <- output = persistent_fn | is_last_phase, SpecificFile f <- output = return f | keep_this_output = persistent_fn | otherwise = newTempName dflags suffix where + hcsuf = hcSuf dflags + odir = objectDir dflags + osuf = objectSuf dflags + keep_hc = dopt Opt_KeepHcFiles dflags + keep_raw_s = dopt Opt_KeepRawSFiles dflags + keep_s = dopt Opt_KeepSFiles dflags + + myPhaseInputExt HCc = hcsuf + myPhaseInputExt StopLn = osuf + myPhaseInputExt other = phaseInputExt other + is_last_phase = next_phase `eqPhase` stop_phase -- sometimes, we keep output from intermediate stages @@ -550,7 +555,7 @@ runPhase :: Phase -- Do this phase first -> String -- basename of original input source -> String -- its extension -> FilePath -- name of file which contains the input to this phase. - -> (Phase -> Maybe ModLocation -> IO FilePath) + -> (DynFlags -> Phase -> Maybe ModLocation -> IO FilePath) -- how to calculate the output filename -> Maybe ModLocation -- the ModLocation, if we have one -> IO (Phase, -- next phase @@ -568,7 +573,7 @@ runPhase :: Phase -- Do this phase first runPhase (Unlit sf) _stop dflags _basename _suff input_fn get_output_fn maybe_loc = do let unlit_flags = getOpts dflags opt_L -- The -h option passes the file name for unlit to put in a #line directive - output_fn <- get_output_fn (Cpp sf) maybe_loc + output_fn <- get_output_fn dflags (Cpp sf) maybe_loc SysTools.runUnlit dflags (map SysTools.Option unlit_flags ++ @@ -594,7 +599,7 @@ runPhase (Cpp sf) _stop dflags0 basename suff input_fn get_output_fn maybe_loc -- to the next phase of the pipeline. return (HsPp sf, dflags, maybe_loc, input_fn) else do - output_fn <- get_output_fn (HsPp sf) maybe_loc + output_fn <- get_output_fn dflags (HsPp sf) maybe_loc doCpp dflags True{-raw-} False{-no CC opts-} input_fn output_fn return (HsPp sf, dflags, maybe_loc, output_fn) @@ -609,7 +614,7 @@ runPhase (HsPp sf) _stop dflags basename suff input_fn get_output_fn maybe_loc else do let hspp_opts = getOpts dflags opt_F let orig_fn = basename `joinFileExt` suff - output_fn <- get_output_fn (Hsc sf) maybe_loc + output_fn <- get_output_fn dflags (Hsc sf) maybe_loc SysTools.runPp dflags ( [ SysTools.Option orig_fn , SysTools.Option input_fn @@ -640,7 +645,7 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma case src_flavour of ExtCoreFile -> do { -- no explicit imports in ExtCore input. ; m <- getCoreModuleName input_fn - ; return (Nothing, mkModule m) } + ; return (Nothing, mkModuleName m) } other -> do { buf <- hGetStringBuffer input_fn ; (_,_,L _ mod_name) <- getImports dflags buf input_fn @@ -677,22 +682,6 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma = location3 { ml_obj_file = ofile } | otherwise = location3 - -- Make the ModSummary to hand to hscMain - src_timestamp <- getModificationTime (basename `joinFileExt` suff) - let - unused_field = panic "runPhase:ModSummary field" - -- Some fields are not looked at by hscMain - mod_summary = ModSummary { ms_mod = mod_name, - ms_hsc_src = src_flavour, - ms_hspp_file = input_fn, - ms_hspp_opts = dflags, - ms_hspp_buf = hspp_buf, - ms_location = location4, - ms_hs_date = src_timestamp, - ms_obj_date = Nothing, - ms_imps = unused_field, - ms_srcimps = unused_field } - o_file = ml_obj_file location4 -- The real object file @@ -703,9 +692,11 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma -- changed (which the compiler itself figures out). -- Setting source_unchanged to False tells the compiler that M.o is out of -- date wrt M.hs (or M.o doesn't exist) so we must recompile regardless. - let do_recomp = dopt Opt_RecompChecking dflags + src_timestamp <- getModificationTime (basename `joinFileExt` suff) + + let force_recomp = dopt Opt_ForceRecomp dflags source_unchanged <- - if not do_recomp || not (isStopLn stop) + if force_recomp || not (isStopLn stop) -- Set source_unchanged to False unconditionally if -- (a) recompilation checker is off, or -- (b) we aren't going all the way to .o file (e.g. ghc -S) @@ -722,7 +713,7 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma -- get the DynFlags let hsc_lang = hscMaybeAdjustTarget dflags stop src_flavour (hscTarget dflags) let next_phase = hscNextPhase dflags src_flavour hsc_lang - output_fn <- get_output_fn next_phase (Just location4) + output_fn <- get_output_fn dflags next_phase (Just location4) let dflags' = dflags { hscTarget = hsc_lang, hscOutName = output_fn, @@ -731,7 +722,22 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma hsc_env <- newHscEnv dflags' -- Tell the finder cache about this module - addHomeModuleToFinder hsc_env mod_name location4 + mod <- addHomeModuleToFinder hsc_env mod_name location4 + + -- Make the ModSummary to hand to hscMain + let + unused_field = panic "runPhase:ModSummary field" + -- Some fields are not looked at by hscMain + mod_summary = ModSummary { ms_mod = mod, + ms_hsc_src = src_flavour, + ms_hspp_file = input_fn, + ms_hspp_opts = dflags, + ms_hspp_buf = hspp_buf, + ms_location = location4, + ms_hs_date = src_timestamp, + ms_obj_date = Nothing, + ms_imps = unused_field, + ms_srcimps = unused_field } -- run the compiler! mbResult <- hscCompileOneShot hsc_env @@ -749,7 +755,7 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma return (StopLn, dflags', Just location4, o_file) Just (HscRecomp hasStub) -> do when hasStub $ - do stub_o <- compileStub dflags' mod_name location4 + do stub_o <- compileStub dflags' mod location4 consIORef v_Ld_inputs stub_o -- In the case of hs-boot files, generate a dummy .o-boot -- stamp file for the benefit of Make @@ -762,7 +768,7 @@ runPhase (Hsc src_flavour) stop dflags0 basename suff input_fn get_output_fn _ma runPhase CmmCpp stop dflags basename suff input_fn get_output_fn maybe_loc = do - output_fn <- get_output_fn Cmm maybe_loc + output_fn <- get_output_fn dflags Cmm maybe_loc doCpp dflags False{-not raw-} True{-include CC opts-} input_fn output_fn return (Cmm, dflags, maybe_loc, output_fn) @@ -770,7 +776,7 @@ runPhase Cmm stop dflags basename suff input_fn get_output_fn maybe_loc = do let hsc_lang = hscMaybeAdjustTarget dflags stop HsSrcFile (hscTarget dflags) let next_phase = hscNextPhase dflags HsSrcFile hsc_lang - output_fn <- get_output_fn next_phase maybe_loc + output_fn <- get_output_fn dflags next_phase maybe_loc let dflags' = dflags { hscTarget = hsc_lang, hscOutName = output_fn, @@ -789,7 +795,7 @@ runPhase Cmm stop dflags basename suff input_fn get_output_fn maybe_loc -- way too many hacks, and I can't say I've ever used it anyway. runPhase cc_phase stop dflags basename suff input_fn get_output_fn maybe_loc - | cc_phase `eqPhase` Cc || cc_phase `eqPhase` HCc + | cc_phase `eqPhase` Cc || cc_phase `eqPhase` Ccpp || cc_phase `eqPhase` HCc = do let cc_opts = getOpts dflags opt_c hcc = cc_phase `eqPhase` HCc @@ -827,7 +833,7 @@ runPhase cc_phase stop dflags basename suff input_fn get_output_fn maybe_loc next_phase | hcc && mangle = Mangle | otherwise = As - output_fn <- get_output_fn next_phase maybe_loc + output_fn <- get_output_fn dflags next_phase maybe_loc let more_hcc_opts = @@ -851,7 +857,8 @@ runPhase cc_phase stop dflags basename suff input_fn get_output_fn maybe_loc -- compiling .hc files, by adding the -x c option. -- Also useful for plain .c files, just in case GHC saw a -- -x c option. - [ SysTools.Option "-x", SysTools.Option "c"] ++ + [ SysTools.Option "-x", if cc_phase `eqPhase` Ccpp + then SysTools.Option "c++" else SysTools.Option "c"] ++ [ SysTools.FileOption "" input_fn , SysTools.Option "-o" , SysTools.FileOption "" output_fn @@ -859,6 +866,15 @@ runPhase cc_phase stop dflags basename suff input_fn get_output_fn maybe_loc ++ map SysTools.Option ( md_c_flags ++ pic_c_flags +#ifdef sparc_TARGET_ARCH + -- We only support SparcV9 and better because V8 lacks an atomic CAS + -- instruction. Note that the user can still override this + -- (e.g., -mcpu=ultrasparc) as GCC picks the "best" -mcpu flag + -- regardless of the ordering. + -- + -- This is a temporary hack. + ++ ["-mcpu=v9"] +#endif ++ (if hcc && mangle then md_regd_c_flags else []) @@ -871,6 +887,10 @@ runPhase cc_phase stop dflags basename suff input_fn get_output_fn maybe_loc ++ split_opt ++ include_paths ++ pkg_extra_cc_opts +#ifdef HAVE_GCC_HAS_WRAPV + -- We need consistent integer overflow (trac #952) + ++ ["-fwrapv"] +#endif )) return (next_phase, dflags, maybe_loc, output_fn) @@ -893,7 +913,7 @@ runPhase Mangle stop dflags _basename _suff input_fn get_output_fn maybe_loc next_phase | split = SplitMangle | otherwise = As - output_fn <- get_output_fn next_phase maybe_loc + output_fn <- get_output_fn dflags next_phase maybe_loc SysTools.runMangle dflags (map SysTools.Option mangler_opts ++ [ SysTools.FileOption "" input_fn @@ -937,7 +957,7 @@ runPhase As stop dflags _basename _suff input_fn get_output_fn maybe_loc = do let as_opts = getOpts dflags opt_a let cmdline_include_paths = includePaths dflags - output_fn <- get_output_fn StopLn maybe_loc + output_fn <- get_output_fn dflags StopLn maybe_loc -- we create directories for the object file, because it -- might be a hierarchical module. @@ -946,6 +966,16 @@ runPhase As stop dflags _basename _suff input_fn get_output_fn maybe_loc SysTools.runAs dflags (map SysTools.Option as_opts ++ [ SysTools.Option ("-I" ++ p) | p <- cmdline_include_paths ] +#ifdef sparc_TARGET_ARCH + -- We only support SparcV9 and better because V8 lacks an atomic CAS + -- instruction so we have to make sure that the assembler accepts the + -- instruction set. Note that the user can still override this + -- (e.g., -mcpu=ultrasparc). GCC picks the "best" -mcpu flag + -- regardless of the ordering. + -- + -- This is a temporary hack. + ++ [ SysTools.Option "-mcpu=v9" ] +#endif ++ [ SysTools.Option "-c" , SysTools.FileOption "" input_fn , SysTools.Option "-o" @@ -957,7 +987,7 @@ runPhase As stop dflags _basename _suff input_fn get_output_fn maybe_loc runPhase SplitAs stop dflags basename _suff _input_fn get_output_fn maybe_loc = do - output_fn <- get_output_fn StopLn maybe_loc + output_fn <- get_output_fn dflags StopLn maybe_loc let (base_o, _) = splitFilename output_fn split_odir = base_o ++ "_split" @@ -1025,18 +1055,18 @@ runPhase SplitAs stop dflags basename _suff _input_fn get_output_fn maybe_loc -- we don't need the generality of a phase (MoveBinary is always -- done after linking and makes only sense in a parallel setup) -- HWL -runPhase_MoveBinary input_fn +runPhase_MoveBinary dflags input_fn = do - sysMan <- getSysMan + let sysMan = pgm_sysman dflags pvm_root <- getEnv "PVM_ROOT" pvm_arch <- getEnv "PVM_ARCH" let pvm_executable_base = "=" ++ input_fn pvm_executable = pvm_root ++ "/bin/" ++ pvm_arch ++ "/" ++ pvm_executable_base -- nuke old binary; maybe use configur'ed names for cp and rm? - system ("rm -f " ++ pvm_executable) + Panic.try (removeFile pvm_executable) -- move the newly created binary into PVM land - system ("cp -p " ++ input_fn ++ " " ++ pvm_executable) + copy dflags "copying PVM executable" input_fn pvm_executable -- generate a wrapper script for running a parallel prg under PVM writeFile input_fn (mk_pvm_wrapper_script pvm_executable pvm_executable_base sysMan) return True @@ -1074,18 +1104,18 @@ mk_pvm_wrapper_script pvm_executable pvm_executable_base sysMan = unlines $ "", "args: while ($a = shift(@ARGV)) {", " if ( $a eq '+RTS' ) {", - " $in_RTS_args = 1;", + " $in_RTS_args = 1;", " } elsif ( $a eq '-RTS' ) {", - " $in_RTS_args = 0;", + " $in_RTS_args = 0;", " }", " if ( $a eq '-d' && $in_RTS_args ) {", - " $debug = '-';", + " $debug = '-';", " } elsif ( $a =~ /^-qN(\\d+)/ && $in_RTS_args ) {", - " $nprocessors = $1;", + " $nprocessors = $1;", " } elsif ( $a =~ /^-qp(\\d+)/ && $in_RTS_args ) {", - " $nprocessors = $1;", + " $nprocessors = $1;", " } else {", - " push(@nonPVM_args, $a);", + " push(@nonPVM_args, $a);", " }", "}", "", @@ -1113,7 +1143,7 @@ checkProcessArgsResult flags filename getHCFilePackages :: FilePath -> IO [PackageId] getHCFilePackages filename = - EXCEPTION.bracket (openFile filename ReadMode) hClose $ \h -> do + Exception.bracket (openFile filename ReadMode) hClose $ \h -> do l <- hGetLine h case l of '/':'*':' ':'G':'H':'C':'_':'P':'A':'C':'K':'A':'G':'E':'S':rest -> @@ -1224,7 +1254,7 @@ staticLink dflags o_files dep_packages = do -- parallel only: move binary to another dir -- HWL when (WayPar `elem` ways) - (do success <- runPhase_MoveBinary output_fn + (do success <- runPhase_MoveBinary dflags output_fn if success then return () else throwDyn (InstallationError ("cannot move binary to PVM dir"))) @@ -1272,12 +1302,8 @@ doMkDLL dflags o_files dep_packages = do let extra_ld_opts = getOpts dflags opt_dll let pstate = pkgState dflags - rts_id | ExtPackage id <- rtsPackageId pstate = id - | otherwise = panic "staticLink: rts package missing" - base_id | ExtPackage id <- basePackageId pstate = id - | otherwise = panic "staticLink: base package missing" - rts_pkg = getPackageDetails pstate rts_id - base_pkg = getPackageDetails pstate base_id + rts_pkg = getPackageDetails pstate rtsPackageId + base_pkg = getPackageDetails pstate basePackageId let extra_os = if static || no_hs_main then []