X-Git-Url: http://git.megacz.com/?a=blobdiff_plain;f=ghc%2Fcompiler%2Fmain%2FFinder.lhs;h=fbde40f6ea261823652d8bd6b4fdc0a93dd6d6bc;hb=9d7da331989abcd1844e9d03b8d1e4163796fa85;hp=2a97fd9f6e58e9f049cebe6f536db087092085c3;hpb=a38fed411ee18754cede5c410ec94f33001c0af3;p=ghc-hetmet.git diff --git a/ghc/compiler/main/Finder.lhs b/ghc/compiler/main/Finder.lhs index 2a97fd9..fbde40f 100644 --- a/ghc/compiler/main/Finder.lhs +++ b/ghc/compiler/main/Finder.lhs @@ -6,76 +6,83 @@ \begin{code} module Finder ( flushFinderCache, -- :: IO () - - findModule, -- :: ModuleName - -- -> IO (Either [FilePath] (Module, ModLocation)) - - findPackageModule, -- :: ModuleName - -- -> IO (Either [FilePath] (Module, ModLocation)) - - mkHomeModLocation, -- :: ModuleName -> FilePath -> IO ModLocation - - findLinkable, -- :: ModuleName -> ModLocation -> IO (Maybe Linkable) - - hiBootExt, -- :: String - hiBootVerExt, -- :: String - + FindResult(..), + findModule, -- :: ModuleName -> Bool -> IO FindResult + findPackageModule, -- :: ModuleName -> Bool -> IO FindResult + mkHomeModLocation, -- :: ModuleName -> FilePath -> IO ModLocation + mkHomeModLocation2, -- :: ModuleName -> FilePath -> String -> IO ModLocation + addHomeModuleToFinder, -- :: HscEnv -> Module -> ModLocation -> IO () + uncacheModule, -- :: HscEnv -> Module -> IO () + mkStubPaths, + + findObjectLinkableMaybe, + findObjectLinkable, + + cantFindError, -- :: DynFlags -> Module -> FindResult -> SDoc ) where #include "HsVersions.h" import Module -import UniqFM ( filterUFM ) -import HscTypes ( Linkable(..), Unlinked(..) ) -import DriverState -import DriverUtil +import UniqFM ( filterUFM, delFromUFM ) +import HscTypes +import Packages import FastString -import Config import Util +import DynFlags ( DynFlags(..), isOneShot, GhcMode(..) ) +import Outputable +import Maybes ( expectJust ) import DATA_IOREF ( IORef, writeIORef, readIORef ) -import List -import Directory -import IO -import Monad +import Data.List +import System.Directory +import System.IO +import Control.Monad +import Data.Maybe ( isNothing ) +import Time ( ClockTime ) + + +type FileExt = String -- Filename extension +type BaseName = String -- Basename of file -- ----------------------------------------------------------------------------- -- The Finder --- The Finder provides a thin filesystem abstraction to the rest of the --- compiler. For a given module, it knows (a) whether the module lives --- in the home package or in another package, so it can make a Module --- from a ModuleName, and (b) where the source, interface, and object --- files for a module live. --- --- It does *not* know which particular package a module lives in, because --- that information is only contained in the interface file. +-- The Finder provides a thin filesystem abstraction to the rest of +-- the compiler. For a given module, it can tell you where the +-- source, interface, and object files for that module live. + +-- It does *not* know which particular package a module lives in. Use +-- Packages.lookupModuleInAllPackages for that. -- ----------------------------------------------------------------------------- -- The finder's cache -GLOBAL_VAR(finder_cache, emptyModuleEnv, ModuleEnv (Module,ModLocation)) - -- remove all the home modules from the cache; package modules are -- assumed to not move around during a session. -flushFinderCache :: IO () -flushFinderCache = do +flushFinderCache :: IORef FinderCache -> IO () +flushFinderCache finder_cache = do + fm <- readIORef finder_cache + writeIORef finder_cache $! filterUFM (\(loc,m) -> isNothing m) fm + +addToFinderCache :: IORef FinderCache -> Module -> FinderCacheEntry -> IO () +addToFinderCache finder_cache mod_name entry = do fm <- readIORef finder_cache - writeIORef finder_cache (filterUFM (not . isHomeModule . fst) fm) + writeIORef finder_cache $! extendModuleEnv fm mod_name entry -addToFinderCache :: ModuleName -> (Module,ModLocation) -> IO () -addToFinderCache mod_name stuff = do +removeFromFinderCache :: IORef FinderCache -> Module -> IO () +removeFromFinderCache finder_cache mod_name = do fm <- readIORef finder_cache - writeIORef finder_cache (extendModuleEnvByName fm mod_name stuff) + writeIORef finder_cache $! delFromUFM fm mod_name -lookupFinderCache :: ModuleName -> IO (Maybe (Module,ModLocation)) -lookupFinderCache mod_name = do +lookupFinderCache :: IORef FinderCache -> Module -> IO (Maybe FinderCacheEntry) +lookupFinderCache finder_cache mod_name = do fm <- readIORef finder_cache - return $! lookupModuleEnvByName fm mod_name + return $! lookupModuleEnv fm mod_name -- ----------------------------------------------------------------------------- --- Locating modules +-- The two external entry points -- This is the main interface to the finder, which maps ModuleNames to -- Modules and ModLocations. @@ -87,159 +94,214 @@ lookupFinderCache mod_name = do -- The ModLocation contains the names of all the files associated with -- that module: its source file, .hi file, object file, etc. -findModule :: ModuleName -> IO (Either [FilePath] (Module, ModLocation)) -findModule name = do - r <- lookupFinderCache name - case r of - Just result -> return (Right result) - Nothing -> do - j <- maybeHomeModule name - case j of - Right home_module -> return (Right home_module) - Left home_files -> do - r <- findPackageMod name - case r of - Right pkg_module -> return (Right pkg_module) - Left pkg_files -> return (Left (home_files ++ pkg_files)) - -findPackageModule :: ModuleName -> IO (Either [FilePath] (Module, ModLocation)) -findPackageModule name = do - r <- lookupFinderCache name - case r of - Just result -> return (Right result) - Nothing -> findPackageMod name - -hiBootExt = "hi-boot" -hiBootVerExt = "hi-boot-" ++ cHscIfaceFileVersion - -maybeHomeModule :: ModuleName -> IO (Either [FilePath] (Module, ModLocation)) -maybeHomeModule mod_name = do - home_path <- readIORef v_Import_paths - hisuf <- readIORef v_Hi_suf - mode <- readIORef v_GhcMode +data FindResult + = Found ModLocation PackageIdH + -- the module was found + | FoundMultiple [PackageId] + -- *error*: both in multiple packages + | PackageHidden PackageId + -- for an explicit source import: the package containing the module is + -- not exposed. + | ModuleHidden PackageId + -- for an explicit source import: the package containing the module is + -- exposed, but the module itself is hidden. + | NotFound [FilePath] + -- the module was not found, the specified places were searched. + +findModule :: HscEnv -> Module -> Bool -> IO FindResult +findModule = findModule' True + +findPackageModule :: HscEnv -> Module -> Bool -> IO FindResult +findPackageModule = findModule' False + + +data LocalFindResult + = Ok FinderCacheEntry + | CantFindAmongst [FilePath] + | MultiplePackages [PackageId] + +findModule' :: Bool -> HscEnv -> Module -> Bool -> IO FindResult +findModule' home_allowed hsc_env name explicit + = do -- First try the cache + mb_entry <- lookupFinderCache cache name + case mb_entry of + Just old_entry -> return $! found old_entry + Nothing -> not_cached + + where + cache = hsc_FC hsc_env + dflags = hsc_dflags hsc_env + + -- We've found the module, so the remaining question is + -- whether it's visible or not + found :: FinderCacheEntry -> FindResult + found (loc, Nothing) + | home_allowed = Found loc HomePackage + | otherwise = NotFound [] + found (loc, Just (pkg, exposed_mod)) + | explicit && not exposed_mod = ModuleHidden pkg_name + | explicit && not (exposed pkg) = PackageHidden pkg_name + | otherwise = + Found loc (ExtPackage (mkPackageId (package pkg))) + where + pkg_name = packageConfigId pkg + + found_new entry = do + addToFinderCache cache name entry + return $! found entry + + not_cached + | not home_allowed = do + j <- findPackageModule' dflags name + case j of + Ok entry -> found_new entry + MultiplePackages pkgs -> return (FoundMultiple pkgs) + CantFindAmongst paths -> return (NotFound paths) + + | otherwise = do + j <- findHomeModule' dflags name + case j of + Ok entry -> found_new entry + MultiplePackages pkgs -> return (FoundMultiple pkgs) + CantFindAmongst home_files -> do + r <- findPackageModule' dflags name + case r of + CantFindAmongst pkg_files -> + return (NotFound (home_files ++ pkg_files)) + MultiplePackages pkgs -> + return (FoundMultiple pkgs) + Ok entry -> + found_new entry + +addHomeModuleToFinder :: HscEnv -> Module -> ModLocation -> IO () +addHomeModuleToFinder hsc_env mod loc + = addToFinderCache (hsc_FC hsc_env) mod (loc, Nothing) + +uncacheModule :: HscEnv -> Module -> IO () +uncacheModule hsc_env mod = removeFromFinderCache (hsc_FC hsc_env) mod + +-- ----------------------------------------------------------------------------- +-- The internal workers + +findHomeModule' :: DynFlags -> Module -> IO LocalFindResult +findHomeModule' dflags mod = do + let home_path = importPaths dflags + hisuf = hiSuf dflags let source_exts = - [ ("hs", mkHomeModLocationSearched mod_name) - , ("lhs", mkHomeModLocationSearched mod_name) + [ ("hs", mkHomeModLocationSearched dflags mod "hs") + , ("lhs", mkHomeModLocationSearched dflags mod "lhs") ] - hi_exts = [ (hisuf, mkHiOnlyModLocation hisuf mod_name) ] + hi_exts = [ (hisuf, mkHiOnlyModLocation dflags hisuf) + , (addBootSuffix hisuf, mkHiOnlyModLocation dflags hisuf) + ] - boot_exts = - [ (hiBootVerExt, mkHiOnlyModLocation hisuf mod_name) - , (hiBootExt, mkHiOnlyModLocation hisuf mod_name) - ] - -- In compilation manager modes, we look for source files in the home -- package because we can compile these automatically. In one-shot -- compilation mode we look for .hi and .hi-boot files only. - -- - -- When generating dependencies, we're interested in either category. - -- - exts - | mode == DoMkDependHS = hi_exts ++ source_exts ++ boot_exts - | isCompManagerMode mode = source_exts - | otherwise {-one-shot-} = hi_exts ++ boot_exts - - searchPathExts home_path mod_name exts - --- ----------------------------------------------------------------------------- --- Looking for a package module - -findPackageMod :: ModuleName -> IO (Either [FilePath] (Module, ModLocation)) -findPackageMod mod_name = do - mode <- readIORef v_GhcMode - imp_dirs <- getPackageImportPath -- including the 'auto' ones - - -- hi-suffix for packages depends on the build tag. - package_hisuf <- - do tag <- readIORef v_Build_tag - if null tag - then return "hi" - else return (tag ++ "_hi") + exts | isOneShot (ghcMode dflags) = hi_exts + | otherwise = source_exts + searchPathExts home_path mod exts + +findPackageModule' :: DynFlags -> Module -> IO LocalFindResult +findPackageModule' dflags mod + = case lookupModuleInAllPackages dflags mod of + [] -> return (CantFindAmongst []) + [pkg_info] -> findPackageIface dflags mod pkg_info + many -> return (MultiplePackages (map (mkPackageId.package.fst) many)) + +findPackageIface :: DynFlags -> Module -> (PackageConfig,Bool) -> IO LocalFindResult +findPackageIface dflags mod pkg_info@(pkg_conf, _) = do let + tag = buildTag dflags + + -- hi-suffix for packages depends on the build tag. + package_hisuf | null tag = "hi" + | otherwise = tag ++ "_hi" hi_exts = - [ (package_hisuf, mkPackageModLocation package_hisuf mod_name) ] + [ (package_hisuf, + mkPackageModLocation dflags pkg_info package_hisuf) ] source_exts = - [ ("hs", mkPackageModLocation package_hisuf mod_name) - , ("lhs", mkPackageModLocation package_hisuf mod_name) + [ ("hs", mkPackageModLocation dflags pkg_info package_hisuf) + , ("lhs", mkPackageModLocation dflags pkg_info package_hisuf) ] - + -- mkdependHS needs to look for source files in packages too, so -- that we can make dependencies between package before they have -- been built. exts - | mode == DoMkDependHS = hi_exts ++ source_exts - | otherwise = hi_exts - + | MkDepend <- ghcMode dflags = hi_exts ++ source_exts + | otherwise = hi_exts -- we never look for a .hi-boot file in an external package; -- .hi-boot files only make sense for the home package. - searchPathExts imp_dirs mod_name exts + + searchPathExts (importDirs pkg_conf) mod exts -- ----------------------------------------------------------------------------- -- General path searching searchPathExts :: [FilePath] -- paths to search - -> ModuleName -- module name + -> Module -- module name -> [ ( - String, -- suffix - String -> String -> String -> IO (Module, ModLocation) -- action + FileExt, -- suffix + FilePath -> BaseName -> IO FinderCacheEntry -- action ) ] - -> IO (Either [FilePath] (Module, ModLocation)) + -> IO LocalFindResult + +searchPathExts paths mod exts + = do result <- search to_search +{- + hPutStrLn stderr (showSDoc $ + vcat [text "Search" <+> ppr mod <+> sep (map (text. fst) exts) + , nest 2 (vcat (map text paths)) + , case result of + Succeeded (loc, p) -> text "Found" <+> ppr loc + Failed fs -> text "not found"]) +-} + return result -searchPathExts path mod_name exts = search to_search where - basename = dots_to_slashes (moduleNameUserString mod_name) + basename = dots_to_slashes (moduleString mod) - to_search :: [(FilePath, IO (Module,ModLocation))] - to_search = [ (file, fn p basename ext) - | p <- path, + to_search :: [(FilePath, IO FinderCacheEntry)] + to_search = [ (file, fn path basename) + | path <- paths, (ext,fn) <- exts, - let base | p == "." = basename - | otherwise = p ++ '/':basename - file = base ++ '.':ext + let base | path == "." = basename + | otherwise = path `joinFileName` basename + file = base `joinFileExt` ext ] - search [] = return (Left (map fst to_search)) - search ((file, result) : rest) = do + search [] = return (CantFindAmongst (map fst to_search)) + search ((file, mk_result) : rest) = do b <- doesFileExist file if b - then Right `liftM` result + then do { res <- mk_result; return (Ok res) } else search rest --- ----------------------------------------------------------------------------- --- Building ModLocations - -mkHiOnlyModLocation hisuf mod_name path basename _ext = do - -- basename == dots_to_slashes (moduleNameUserString mod_name) - loc <- hiOnlyModLocation path basename hisuf - let result = (mkHomeModule mod_name, loc) - addToFinderCache mod_name result - return result - -mkPackageModLocation hisuf mod_name path basename _ext = do - -- basename == dots_to_slashes (moduleNameUserString mod_name) - loc <- hiOnlyModLocation path basename hisuf - let result = (mkPackageModule mod_name, loc) - addToFinderCache mod_name result - return result - -hiOnlyModLocation path basename hisuf - = do { obj_fn <- mkObjPath path basename ; - return (ModLocation{ ml_hspp_file = Nothing, - ml_hs_file = Nothing, - ml_hi_file = path ++ '/':basename ++ '.':hisuf, - -- Remove the .hi-boot suffix from - -- hi_file, if it had one. We always - -- want the name of the real .hi file - -- in the ml_hi_file field. - ml_obj_file = obj_fn - })} +mkHomeModLocationSearched :: DynFlags -> Module -> FileExt + -> FilePath -> BaseName -> IO FinderCacheEntry +mkHomeModLocationSearched dflags mod suff path basename = do + loc <- mkHomeModLocation2 dflags mod (path `joinFileName` basename) suff + return (loc, Nothing) + +mkHiOnlyModLocation :: DynFlags -> FileExt -> FilePath -> BaseName + -> IO FinderCacheEntry +mkHiOnlyModLocation dflags hisuf path basename = do + loc <- hiOnlyModLocation dflags path basename hisuf + return (loc, Nothing) + +mkPackageModLocation :: DynFlags -> (PackageConfig, Bool) -> FileExt + -> FilePath -> BaseName -> IO FinderCacheEntry +mkPackageModLocation dflags pkg_info hisuf path basename = do + loc <- hiOnlyModLocation dflags path basename hisuf + return (loc, Just pkg_info) -- ----------------------------------------------------------------------------- -- Constructing a home module location @@ -260,7 +322,7 @@ hiOnlyModLocation path basename hisuf -- -- Parameters are: -- --- mod_name +-- mod -- The name of the module -- -- path @@ -268,89 +330,170 @@ hiOnlyModLocation path basename hisuf -- (b) and (c): "." -- -- src_basename --- (a): dots_to_slashes (moduleNameUserString mod_name) +-- (a): dots_to_slashes (moduleNameUserString mod) -- (b) and (c): The filename of the source file, minus its extension -- -- ext -- The filename extension of the source file (usually "hs" or "lhs"). -mkHomeModLocation mod_name src_filename = do - let mod_basename = dots_to_slashes (moduleNameUserString mod_name) - (basename,extension) = splitFilename src_filename - - case my_prefix_match (reverse mod_basename) (reverse basename) of - Just "" -> - mkHomeModLocationSearched mod_name "." mod_basename extension - Just rest -> do - let path = reverse (dropWhile (=='/') rest) - mkHomeModLocationSearched mod_name path mod_basename extension - Nothing -> do - -- hPutStrLn stderr ("Warning: " ++ src_filename ++ - -- ": filename and module name do not match") - let (dir,basename,ext) = splitFilename3 src_filename - mkHomeModLocationSearched mod_name dir basename ext - -mkHomeModLocationSearched mod_name path src_basename ext = do - hisuf <- readIORef v_Hi_suf - hidir <- readIORef v_Hi_dir - - let mod_basename = dots_to_slashes (moduleNameUserString mod_name) - - obj_fn <- mkObjPath path mod_basename +mkHomeModLocation :: DynFlags -> Module -> FilePath -> IO ModLocation +mkHomeModLocation dflags mod src_filename = do + let (basename,extension) = splitFilename src_filename + mkHomeModLocation2 dflags mod basename extension + +mkHomeModLocation2 :: DynFlags + -> Module + -> FilePath -- Of source module, without suffix + -> String -- Suffix + -> IO ModLocation +mkHomeModLocation2 dflags mod src_basename ext = do + let mod_basename = dots_to_slashes (moduleString mod) + + obj_fn <- mkObjPath dflags src_basename mod_basename + hi_fn <- mkHiPath dflags src_basename mod_basename + + return (ModLocation{ ml_hs_file = Just (src_basename `joinFileExt` ext), + ml_hi_file = hi_fn, + ml_obj_file = obj_fn }) + +hiOnlyModLocation :: DynFlags -> FilePath -> String -> Suffix -> IO ModLocation +hiOnlyModLocation dflags path basename hisuf + = do let full_basename = path `joinFileName` basename + obj_fn <- mkObjPath dflags full_basename basename + return ModLocation{ ml_hs_file = Nothing, + ml_hi_file = full_basename `joinFileExt` hisuf, + -- Remove the .hi-boot suffix from + -- hi_file, if it had one. We always + -- want the name of the real .hi file + -- in the ml_hi_file field. + ml_obj_file = obj_fn + } + +-- | Constructs the filename of a .o file for a given source file. +-- Does /not/ check whether the .o file exists +mkObjPath + :: DynFlags + -> FilePath -- the filename of the source file, minus the extension + -> String -- the module name with dots replaced by slashes + -> IO FilePath +mkObjPath dflags basename mod_basename + = do let + odir = objectDir dflags + osuf = objectSuf dflags + + obj_basename | Just dir <- odir = dir `joinFileName` mod_basename + | otherwise = basename + + return (obj_basename `joinFileExt` osuf) + +-- | Constructs the filename of a .hi file for a given source file. +-- Does /not/ check whether the .hi file exists +mkHiPath + :: DynFlags + -> FilePath -- the filename of the source file, minus the extension + -> String -- the module name with dots replaced by slashes + -> IO FilePath +mkHiPath dflags basename mod_basename + = do let + hidir = hiDir dflags + hisuf = hiSuf dflags + + hi_basename | Just dir <- hidir = dir `joinFileName` mod_basename + | otherwise = basename + + return (hi_basename `joinFileExt` hisuf) - let -- hi filename, always follows the module name - hi_path | Just d <- hidir = d - | otherwise = path - hi_fn = hi_path ++ '/':mod_basename ++ '.':hisuf +-- ----------------------------------------------------------------------------- +-- Filenames of the stub files - -- source filename - source_fn = path ++ '/':src_basename ++ '.':ext +-- We don't have to store these in ModLocations, because they can be derived +-- from other available information, and they're only rarely needed. - result = ( mkHomeModule mod_name, - ModLocation{ ml_hspp_file = Nothing, - ml_hs_file = Just source_fn, - ml_hi_file = hi_fn, - ml_obj_file = obj_fn, - }) +mkStubPaths + :: DynFlags + -> Module + -> ModLocation + -> (FilePath,FilePath) - addToFinderCache mod_name result - return result +mkStubPaths dflags mod location + = let + stubdir = stubDir dflags -mkObjPath :: FilePath -> String -> IO FilePath --- Construct the filename of a .o file. --- Does *not* check whether the .o file exists -mkObjPath path basename - = do odir <- readIORef v_Output_dir - osuf <- readIORef v_Object_suf + mod_basename = dots_to_slashes (moduleString mod) + src_basename = basenameOf (expectJust "mkStubPaths" + (ml_hs_file location)) - let obj_path | Just d <- odir = d - | otherwise = path + stub_basename0 + | Just dir <- stubdir = dir `joinFileName` mod_basename + | otherwise = src_basename - return (obj_path ++ '/':basename ++ '.':osuf) + stub_basename = stub_basename0 ++ "_stub" + in + (stub_basename `joinFileExt` "c", + stub_basename `joinFileExt` "h") + -- the _stub.o filename is derived from the ml_obj_file. -- ----------------------------------------------------------------------------- -- findLinkable isn't related to the other stuff in here, -- but there's no other obvious place for it -findLinkable :: ModuleName -> ModLocation -> IO (Maybe Linkable) -findLinkable mod locn +findObjectLinkableMaybe :: Module -> ModLocation -> IO (Maybe Linkable) +findObjectLinkableMaybe mod locn = do let obj_fn = ml_obj_file locn - obj_exist <- doesFileExist obj_fn - if not obj_exist - then return Nothing - else - do let stub_fn = case splitFilename3 obj_fn of - (dir, base, ext) -> dir ++ "/" ++ base ++ "_stub.o" - stub_exist <- doesFileExist stub_fn - obj_time <- getModificationTime obj_fn - if stub_exist - then return (Just (LM obj_time mod [DotO obj_fn, DotO stub_fn])) - else return (Just (LM obj_time mod [DotO obj_fn])) + maybe_obj_time <- modificationTimeIfExists obj_fn + case maybe_obj_time of + Nothing -> return Nothing + Just obj_time -> liftM Just (findObjectLinkable mod obj_fn obj_time) + +-- Make an object linkable when we know the object file exists, and we know +-- its modification time. +findObjectLinkable :: Module -> FilePath -> ClockTime -> IO Linkable +findObjectLinkable mod obj_fn obj_time = do + let stub_fn = case splitFilename3 obj_fn of + (dir, base, ext) -> dir ++ "/" ++ base ++ "_stub.o" + stub_exist <- doesFileExist stub_fn + if stub_exist + then return (LM obj_time mod [DotO obj_fn, DotO stub_fn]) + else return (LM obj_time mod [DotO obj_fn]) -- ----------------------------------------------------------------------------- -- Utils dots_to_slashes = map (\c -> if c == '.' then '/' else c) + +-- ----------------------------------------------------------------------------- +-- Error messages + +cantFindError :: DynFlags -> Module -> FindResult -> SDoc +cantFindError dflags mod_name (FoundMultiple pkgs) + = hang (ptext SLIT("Cannot import") <+> quotes (ppr mod_name) <> colon) 2 ( + sep [ptext SLIT("it was found in multiple packages:"), + hsep (map (text.packageIdString) pkgs)] + ) +cantFindError dflags mod_name find_result + = hang (ptext SLIT("Could not find module") <+> quotes (ppr mod_name) <> colon) + 2 more_info + where + more_info + = case find_result of + PackageHidden pkg + -> ptext SLIT("it is a member of package") <+> ppr pkg <> comma + <+> ptext SLIT("which is hidden") + + ModuleHidden pkg + -> ptext SLIT("it is hidden") <+> parens (ptext SLIT("in package") + <+> ppr pkg) + + NotFound files + | null files + -> ptext SLIT("it is not a module in the current program, or in any known package.") + | verbosity dflags < 3 + -> ptext SLIT("use -v to see a list of the files searched for") + | otherwise + -> hang (ptext SLIT("locations searched:")) + 2 (vcat (map text files)) + + _ -> panic "cantFindErr" \end{code}