ghc-mod/GhcMod/Exe/Debug.hs

183 lines
6.0 KiB
Haskell
Raw Permalink Normal View History

module GhcMod.Exe.Debug (debugInfo, rootInfo, componentInfo) where
2013-03-04 02:21:41 +00:00
import Control.Arrow (first)
2015-04-13 22:51:03 +00:00
import Control.Applicative
import Control.Monad
import qualified Data.Map as Map
import qualified Data.Set as Set
2015-03-28 01:33:42 +00:00
import Data.Char
import Data.Maybe
import Data.Version
2015-04-13 22:51:03 +00:00
import Data.List.Split
import System.Directory
import GhcMod.Exe.Internal
import GhcMod.Cradle
import GhcMod.Monad
import GhcMod.Output
import GhcMod.Pretty
import GhcMod.Stack
import GhcMod.Target
import GhcMod.Types
import GhcMod.Utils
import Paths_ghc_mod (version)
import Config (cProjectVersion)
import Pretty
2013-03-04 02:21:41 +00:00
----------------------------------------------------------------
2013-05-20 05:28:56 +00:00
-- | Obtaining debug information.
debugInfo :: IOish m => GhcModT m String
debugInfo = do
Options {..} <- options
Cradle {..} <- cradle
2014-03-20 07:21:48 +00:00
[ghcPath, ghcPkgPath] <- liftIO $
case cradleProject of
StackProject se ->
catMaybes <$> sequence [getStackGhcPath se, getStackGhcPkgPath se]
_ ->
return ["ghc", "ghc-pkg"]
cabal <-
case cradleProject of
CabalProject -> cabalDebug ghcPkgPath
StackProject {} -> (++) <$> stackPaths <*> cabalDebug ghcPkgPath
2015-08-12 07:25:13 +00:00
_ -> return []
pkgOpts <- packageGhcOptions
readProc <- gmReadProcess
ghcVersion <- liftIO $
dropWhileEnd isSpace <$> readProc ghcPath ["--numeric-version"] ""
return $ unlines $
[ "Version: ghc-mod-" ++ showVersion version
, "Library GHC Version: " ++ cProjectVersion
, "System GHC Version: " ++ ghcVersion
, "Root directory: " ++ cradleRootDir
, "Current directory: " ++ cradleCurrentDir
2017-05-12 13:28:08 +00:00
, "GHC Package flags:\n" ++ renderGm (nest 4 $
fsep $ map text pkgOpts)
, "GHC System libraries: " ++ ghcLibDir
] ++ cabal
2015-09-02 03:30:00 +00:00
stackPaths :: IOish m => GhcModT m [String]
stackPaths = do
Cradle { cradleProject = StackProject senv } <- cradle
ghc <- getStackGhcPath senv
ghcPkg <- getStackGhcPkgPath senv
2015-09-02 03:30:00 +00:00
return $
[ "Stack ghc executable: " ++ show ghc
, "Stack ghc-pkg executable:" ++ show ghcPkg
]
cabalDebug :: IOish m => FilePath -> GhcModT m [String]
cabalDebug ghcPkgPath = do
Cradle {..} <- cradle
mcs <- cabalResolvedComponents
let entrypoints = Map.map gmcEntrypoints mcs
graphs = Map.map gmcHomeModuleGraph mcs
opts = Map.map gmcGhcOpts mcs
srcOpts = Map.map gmcGhcSrcOpts mcs
readProc <- gmReadProcess
cabalExists <- liftIO $ (/=Nothing) <$> findExecutable "cabal"
cabalInstVersion <-
if cabalExists
then liftIO $
dropWhileEnd isSpace <$> readProc "cabal" ["--numeric-version"] ""
else return ""
packages <- liftIO $ readProc ghcPkgPath ["list", "--simple-output"] ""
let cabalPackages = filter ((== ["Cabal"]) . take 1 . splitOn "-") $ splitWhen isSpace packages
return $
[ "cabal-install Version: " ++ cabalInstVersion
2017-05-12 13:28:08 +00:00
, "Cabal Library Versions:\n" ++ renderGm (nest 4 $
fsep $ map text cabalPackages)
, "Cabal file: " ++ show cradleCabalFile
, "Project: " ++ show cradleProject
2017-05-12 13:28:08 +00:00
, "Cabal entrypoints:\n" ++ renderGm (nest 4 $
mapDoc gmComponentNameDoc smpDoc entrypoints)
2017-05-12 13:28:08 +00:00
, "Cabal components:\n" ++ renderGm (nest 4 $
mapDoc gmComponentNameDoc graphDoc graphs)
2017-05-12 13:28:08 +00:00
, "GHC Cabal options:\n" ++ renderGm (nest 4 $
mapDoc gmComponentNameDoc (fsep . map text) opts)
2017-05-12 13:28:08 +00:00
, "GHC search path options:\n" ++ renderGm (nest 4 $
mapDoc gmComponentNameDoc (fsep . map text) srcOpts)
]
2015-03-28 01:33:42 +00:00
componentInfo :: IOish m => [String] -> GhcModT m String
componentInfo ts = do
2015-04-12 00:48:05 +00:00
-- TODO: most of this is copypasta of targetGhcOptions. Factor out more
-- useful function from there.
2015-03-28 01:33:42 +00:00
crdl <- cradle
2015-04-13 22:51:03 +00:00
sefnmn <- Set.fromList `liftM` mapM guessModuleFile ts
mcs <- cabalResolvedComponents
2015-04-12 00:48:05 +00:00
let
mdlcs = moduleComponents mcs `zipMap` Set.toList sefnmn
candidates = findCandidates $ map snd mdlcs
cn = pickComponent candidates
opts <- targetGhcOptions crdl sefnmn
2015-03-28 01:33:42 +00:00
return $ unlines $
2017-05-12 13:28:08 +00:00
[ "Matching Components:\n" ++ renderGm (nest 4 $
2015-04-12 00:48:05 +00:00
alistDoc (either text mnDoc) (setDoc gmComponentNameDoc) mdlcs)
2017-05-12 13:28:08 +00:00
, "Picked Component:\n" ++ renderGm (nest 4 $
2015-04-12 00:48:05 +00:00
gmComponentNameDoc cn)
2017-05-12 13:28:08 +00:00
, "GHC Cabal options:\n" ++ renderGm (nest 4 $ fsep $ map text opts)
2015-03-28 01:33:42 +00:00
]
2015-04-12 00:48:05 +00:00
where
zipMap f l = l `zip` (f `map` l)
2015-03-28 01:33:42 +00:00
2015-04-13 22:51:03 +00:00
guessModuleFile :: MonadIO m => String -> m (Either FilePath ModuleName)
guessModuleFile m
| (isUpper . head .&&. (all $ all $ isAlphaNum .||. (=='.')) . splitOn ".") m =
return $ Right $ mkModuleName m
where
infixr 1 .||.
infixr 2 .&&.
(.||.) = liftA2 (||)
(.&&.) = liftA2 (&&)
guessModuleFile str = Left `liftM` liftIO (canonFilePath str)
2015-03-28 01:33:42 +00:00
graphDoc :: GmModuleGraph -> Doc
graphDoc GmModuleGraph{..} =
2015-04-12 00:48:05 +00:00
mapDoc mpDoc smpDoc' gmgGraph
where
smpDoc' smp = vcat $ map mpDoc' $ Set.toList smp
mpDoc' = text . moduleNameString . mpModule
2015-04-12 00:48:05 +00:00
setDoc :: (a -> Doc) -> Set.Set a -> Doc
setDoc f s = vcat $ map f $ Set.toList s
smpDoc :: Set.Set ModulePath -> Doc
2015-04-12 00:48:05 +00:00
smpDoc smp = setDoc mpDoc smp
mpDoc :: ModulePath -> Doc
mpDoc (ModulePath mn fn) = text (moduleNameString mn) <+> parens (text fn)
2015-04-12 00:48:05 +00:00
mnDoc :: ModuleName -> Doc
mnDoc mn = text (moduleNameString mn)
alistDoc :: Ord k => (k -> Doc) -> (a -> Doc) -> [(k, a)] -> Doc
alistDoc fk fa alist = mapDoc fk fa (Map.fromList alist)
mapDoc :: (k -> Doc) -> (a -> Doc) -> Map.Map k a -> Doc
mapDoc kd ad m = vcat $
map (uncurry ($+$)) $ map (first kd) $ Map.toList $ Map.map (nest 4 . ad) m
2014-03-20 07:21:48 +00:00
----------------------------------------------------------------
-- | Obtaining root information.
rootInfo :: forall m. (IOish m, GmOut m, GmEnv m) => m String
rootInfo = do
crdl <- findCradleNoLog =<< (optPrograms <$> options)
liftIO $ cleanupCradle crdl
return $ cradleRootDir crdl ++ "\n"