From 914d428ff1a1529b98206f9f3575c88ade7ea38b Mon Sep 17 00:00:00 2001 From: Daniel Gröber Date: Fri, 26 Oct 2018 04:21:38 +0200 Subject: Split up Compile.hs into multiple modules --- src/CabalHelper/Compiletime/Cabal.hs | 180 +++++++++ src/CabalHelper/Compiletime/Compile.hs | 413 +-------------------- src/CabalHelper/Compiletime/Log.hs | 40 ++ src/CabalHelper/Compiletime/Process.hs | 76 ++++ .../Compiletime/Program/CabalInstall.hs | 209 +++++++++++ src/CabalHelper/Compiletime/Program/GHC.hs | 125 +++++++ src/CabalHelper/Compiletime/Program/Stack.hs | 2 +- src/CabalHelper/Compiletime/Types.hs | 3 +- src/CabalHelper/Shared/Common.hs | 9 - 9 files changed, 642 insertions(+), 415 deletions(-) create mode 100644 src/CabalHelper/Compiletime/Cabal.hs create mode 100644 src/CabalHelper/Compiletime/Log.hs create mode 100644 src/CabalHelper/Compiletime/Process.hs create mode 100644 src/CabalHelper/Compiletime/Program/CabalInstall.hs create mode 100644 src/CabalHelper/Compiletime/Program/GHC.hs (limited to 'src') diff --git a/src/CabalHelper/Compiletime/Cabal.hs b/src/CabalHelper/Compiletime/Cabal.hs new file mode 100644 index 0000000..9e6fbeb --- /dev/null +++ b/src/CabalHelper/Compiletime/Cabal.hs @@ -0,0 +1,180 @@ +-- cabal-helper: Simple interface to Cabal's configuration state +-- Copyright (C) 2018 Daniel Gröber +-- +-- This program is free software: you can redistribute it and/or modify +-- it under the terms of the GNU General Public License as published by +-- the Free Software Foundation, either version 3 of the License, or +-- (at your option) any later version. +-- +-- This program is distributed in the hope that it will be useful, +-- but WITHOUT ANY WARRANTY; without even the implied warranty of +-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the +-- GNU General Public License for more details. +-- +-- You should have received a copy of the GNU General Public License +-- along with this program. If not, see . + +{-| +Module : CabalHelper.Compiletime.Program.Cabal +Description : cabal-install program interface +License : GPL-3 +-} + +module CabalHelper.Compiletime.Cabal where + +import Control.Exception (bracket) +import Control.Monad.IO.Class +import Data.List +import Data.Maybe +import Data.Version +import System.Exit +import System.Directory +import System.FilePath + +import CabalHelper.Compiletime.Types +import CabalHelper.Compiletime.Process +import CabalHelper.Shared.Common (trim, replace) +import Paths_cabal_helper (version) + +-- | Cabal library version we're compiling the helper exe against. +data CabalVersion + = CabalHEAD { cvCommitId :: CommitId } + | CabalVersion { cabalVersion :: Version } + +newtype CommitId = CommitId { unCommitId :: String } + +showCabalVersion :: CabalVersion -> String +showCabalVersion (CabalHEAD commitid) = + "HEAD-" ++ unCommitId commitid +showCabalVersion CabalVersion {cabalVersion} = + showVersion cabalVersion + +exeName :: CabalVersion -> String +exeName (CabalHEAD commitid) = intercalate "--" + [ "cabal-helper-" ++ showVersion version + , "Cabal-HEAD" ++ unCommitId commitid + ] +exeName CabalVersion {cabalVersion} = intercalate "--" + [ "cabal-helper-" ++ showVersion version + , "Cabal-" ++ showVersion cabalVersion + ] + +data CabalPatchDescription = CabalPatchDescription { + cpdVersions :: [Version], + cpdUnpackVariant :: UnpackCabalVariant, + cpdPatchFn :: FilePath -> IO () + } +nopCabalPatchDescription :: CabalPatchDescription +nopCabalPatchDescription = CabalPatchDescription [] LatestRevision (const (return ())) + +patchyCabalVersions :: [CabalPatchDescription] +patchyCabalVersions = [ + let versions = [ Version [1,18,1] [] ] + variant = Pristine + patch = fixArrayConstraint + in CabalPatchDescription versions variant patch, + + let versions = [ Version [1,18,0] [] ] + variant = Pristine + patch dir = do + fixArrayConstraint dir + fixOrphanInstance dir + in CabalPatchDescription versions variant patch, + + let versions = [ Version [1,24,1,0] [] ] + variant = Pristine + patch _ = return () + in CabalPatchDescription versions variant patch + ] + where + fixArrayConstraint dir = do + let cabalFile = dir "Cabal.cabal" + cabalFileTmp = cabalFile ++ ".tmp" + + cf <- readFile cabalFile + writeFile cabalFileTmp $ replace "&& < 0.5" "&& < 0.6" cf + renameFile cabalFileTmp cabalFile + + fixOrphanInstance dir = do + let versionFile = dir "Distribution/Version.hs" + versionFileTmp = versionFile ++ ".tmp" + + let languagePragma = + "{-# LANGUAGE DeriveDataTypeable, StandaloneDeriving #-}" + languagePragmaCPP = + "{-# LANGUAGE CPP, DeriveDataTypeable, StandaloneDeriving #-}" + + derivingDataVersion = + "deriving instance Data Version" + derivingDataVersionCPP = unlines [ + "#if __GLASGOW_HASKELL__ < 707", + derivingDataVersion, + "#endif" + ] + + vf <- readFile versionFile + writeFile versionFileTmp + $ replace derivingDataVersion derivingDataVersionCPP + $ replace languagePragma languagePragmaCPP vf + + renameFile versionFileTmp versionFile + +unpackPatchedCabal + :: Env + => Version + -> FilePath + -> IO CabalSourceDir +unpackPatchedCabal cabalVer tmpdir = do + res@(CabalSourceDir dir) <- unpackCabal cabalVer tmpdir variant + patch dir + return res + where + CabalPatchDescription _ variant patch = fromMaybe nopCabalPatchDescription $ + find ((cabalVer `elem`) . cpdVersions) patchyCabalVersions + + +data UnpackCabalVariant = Pristine | LatestRevision +newtype CabalSourceDir = CabalSourceDir { unCabalSourceDir :: FilePath } +unpackCabal + :: (Verbose, Progs) + => Version + -> FilePath + -> UnpackCabalVariant + -> IO CabalSourceDir +unpackCabal cabalVer tmpdir variant = do + let cabal = "Cabal-" ++ showVersion cabalVer + dir = tmpdir cabal + variant_opts = case variant of Pristine -> [ "--pristine" ]; _ -> [] + args = [ "get", cabal ] ++ variant_opts + callProcessStderr (Just tmpdir) (cabalProgram ?progs) args + return $ CabalSourceDir dir + +unpackCabalHEAD :: Env => FilePath -> IO (CabalSourceDir, CommitId) +unpackCabalHEAD tmpdir = do + let dir = tmpdir "cabal-head.git" + url = "https://github.com/haskell/cabal.git" + ExitSuccess <- rawSystem "git" [ "clone", "--depth=1", url, dir] + commit <- + withDirectory_ dir $ trim <$> readProcess' "git" ["rev-parse", "HEAD"] "" + return (CabalSourceDir $ dir "Cabal", CommitId commit) + where + withDirectory_ :: FilePath -> IO a -> IO a + withDirectory_ dir action = + bracket + (liftIO getCurrentDirectory) + (liftIO . setCurrentDirectory) + (\_ -> liftIO (setCurrentDirectory dir) >> action) + +findCabalFile :: FilePath -> IO FilePath +findCabalFile pkgdir = do + [cfile] <- filter isCabalFile <$> getDirectoryContents pkgdir + return cfile + where + isCabalFile :: FilePath -> Bool + isCabalFile f = takeExtension' f == ".cabal" + + takeExtension' :: FilePath -> String + takeExtension' p = + if takeFileName p == takeExtension p + then "" -- just ".cabal" is not a valid cabal file + else takeExtension p diff --git a/src/CabalHelper/Compiletime/Compile.hs b/src/CabalHelper/Compiletime/Compile.hs index 6403aca..8a07077 100644 --- a/src/CabalHelper/Compiletime/Compile.hs +++ b/src/CabalHelper/Compiletime/Compile.hs @@ -13,8 +13,8 @@ -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see . -{-# LANGUAGE FlexibleContexts, DeriveFunctor, GADTs, ConstraintKinds, - ImplicitParams, NamedFieldPuns, RecordWildCards #-} + +{-# LANGUAGE DeriveFunctor, GADTs #-} {-| Module : CabalHelper.Compiletime.Compile @@ -38,17 +38,11 @@ import Data.List import Data.Maybe import Data.String import Data.Version -import GHC.IO.Exception (IOErrorType(OtherError)) import Text.Printf -import Text.Read import System.Directory import System.FilePath -import System.Process import System.Exit -import System.Environment import System.IO -import System.IO.Error -import System.IO.Temp import Prelude import qualified Data.Text as Text @@ -59,14 +53,11 @@ import Distribution.System import Distribution.Text ( display ) -import Paths_cabal_helper - ( version ) - ---import CabalHelper.Compiletime.Cabal +import CabalHelper.Compiletime.Cabal import CabalHelper.Compiletime.Data ---import CabalHelper.Compiletime.Log ---import CabalHelper.Compiletime.Program.GHC ---import CabalHelper.Compiletime.Program.CabalInstall +import CabalHelper.Compiletime.Log +import CabalHelper.Compiletime.Program.GHC +import CabalHelper.Compiletime.Program.CabalInstall import CabalHelper.Compiletime.Types import CabalHelper.Shared.Common @@ -140,7 +131,7 @@ compileHelper CompHelperEnv{..} = do -- | Check if this version is globally available compileGlobal :: Env => MaybeT IO (IO (), Compile) compileGlobal = do - cabal_versions <- listCabalVersions' Nothing + cabal_versions <- listCabalVersions Nothing ver <- MaybeT $ return $ find (== cheCabalVer) cabal_versions vLog $ logMsg ++ "user/global package-db" return $ (return (), compileWithPkg Nothing ver CPSGlobal) @@ -150,7 +141,7 @@ compileHelper CompHelperEnv{..} = do compileSandbox ghcVer = do let mdb_path = getSandboxPkgDb (display buildPlatform) ghcVer cheProjDir sandbox <- PackageDbDir <$> MaybeT mdb_path - cabal_versions <- listCabalVersions' (Just sandbox) + cabal_versions <- listCabalVersions (Just sandbox) ver <- MaybeT $ return $ find (== cheCabalVer) cabal_versions vLog $ logMsg ++ "sandbox package-db" return $ (return (), compileWithPkg (Just sandbox) ver CPSProject) @@ -167,7 +158,7 @@ compileHelper CompHelperEnv{..} = do let inplace_db_path = distdir_newstyle "packagedb" ("ghc-" ++ showVersion ghcVer) inplace_db = PackageDbDir inplace_db_path - cabal_versions <- listCabalVersions' (Just inplace_db) + cabal_versions <- listCabalVersions (Just inplace_db) ver <- MaybeT $ return $ find (== cheCabalVer) cabal_versions vLog $ logMsg ++ "v2-build package-db " ++ inplace_db_path return $ (return (), compileWithPkg (Just inplace_db) ver CPSProject) @@ -184,7 +175,7 @@ compileHelper CompHelperEnv{..} = do prepare db = do db_exists <- liftIO $ cabalVersionExistsInPkgDb cheCabalVer db when (not db_exists) $ - void $ installCabal (Right cheCabalVer) `E.catch` + void $ installCabalLib (Right cheCabalVer) `E.catch` \(SomeException _) -> errorInstallCabal cheCabalVer -- | See if we're in a cabal source tree @@ -255,18 +246,6 @@ compPaths appdir cachedir c = compOutDir = compBuildDir compExePath = compOutDir "cabal-helper" -data GhcInvocation = GhcInvocation - { giOutDir :: FilePath - , giOutput :: FilePath - , giCPPOptions :: [String] - , giPackageDBs :: [PackageDbDir] - , giIncludeDirs :: [FilePath] - , giHideAllPackages :: Bool - , giPackages :: [String] - , giWarningFlags :: [String] - , giInputs :: [String] - } - compGhcInvocation :: Compile -> CompPaths -> GhcInvocation compGhcInvocation comp CompPaths {..} = case comp of @@ -326,120 +305,6 @@ cabalMinVersionMacro (Version (mj1:mj2:mi:_) _) = cabalMinVersionMacro _ = error "cabalMinVersionMacro: Version must have at least 3 components" -invokeGhc - :: (Verbose, CProgs) => GhcInvocation -> IO (Either ExitCode FilePath) -invokeGhc GhcInvocation {..} = do - rv <- callProcessStderr' Nothing (ghcProgram ?cprogs) $ concat - [ [ "-outputdir", giOutDir - , "-o", giOutput - ] - , map ("-optP"++) giCPPOptions - , map ("-package-conf="++) $ unPackageDbDir <$> giPackageDBs - , map ("-i"++) $ nub $ "" : giIncludeDirs - , if giHideAllPackages then ["-hide-all-packages"] else [] - , concatMap (\p -> ["-package", p]) giPackages - , giWarningFlags - , ["--make"] - , giInputs - ] - return $ - case rv of - ExitSuccess -> Right giOutput - e@(ExitFailure _) -> Left e - - --- | Cabal library version we're compiling the helper exe against. -data CabalVersion - = CabalHEAD { cvCommitId :: CommitId } - | CabalVersion { cabalVersion :: Version } - -newtype CommitId = CommitId { unCommitId :: String } - -exeName :: CabalVersion -> String -exeName (CabalHEAD commitid) = intercalate "-" - [ "cabal-helper" ++ showVersion version - , "CabalHEAD" ++ unCommitId commitid - ] -exeName CabalVersion {cabalVersion} = intercalate "-" - [ "cabal-helper" ++ showVersion version - , "Cabal" ++ showVersion cabalVersion - ] - -readProcess' :: Verbose => FilePath -> [String] -> String -> IO String -readProcess' exe args inp = do - vLog $ intercalate " " $ map formatProcessArg (exe:args) - outp <- readProcess exe args inp - vLog $ unlines $ map ("=> "++) $ lines outp - return outp - -callProcessStderr' - :: Verbose => Maybe FilePath -> FilePath -> [String] -> IO ExitCode -callProcessStderr' mwd exe args = do - let cd = case mwd of - Nothing -> []; Just wd -> [ "cd", formatProcessArg wd++";" ] - vLog $ intercalate " " $ cd ++ map formatProcessArg (exe:args) - (_, _, _, h) <- createProcess (proc exe args) { std_out = UseHandle stderr - , cwd = mwd } - waitForProcess h - -callProcessStderr :: Verbose => Maybe FilePath -> FilePath -> [String] -> IO () -callProcessStderr mwd exe args = do - rv <- callProcessStderr' mwd exe args - case rv of - ExitSuccess -> return () - ExitFailure v -> processFailedException "callProcessStderr" exe args v - -processFailedException :: String -> String -> [String] -> Int -> IO a -processFailedException fn exe args rv = - ioError $ mkIOError OtherError msg Nothing Nothing - where - msg = concat [ fn, ": ", exe, " " - , intercalate " " (map formatProcessArg args) - , " (exit " ++ show rv ++ ")" - ] - -formatProcessArg :: String -> String -formatProcessArg xs - | any isSpace xs = "'"++ xs ++"'" - | otherwise = xs - -data HEAD = HEAD deriving (Eq, Show) - -installCabal :: Env => Either HEAD Version -> IO (PackageDbDir, CabalVersion) -installCabal ever = do - appdir <- appCacheDir - let message ver = do - let sver = showVersion ver - hPutStr stderr $ printf "\ -\cabal-helper-wrapper: Installing a private copy of Cabal because we couldn't\n\ -\find the right version in your global/user package-db, this might take a\n\ -\while but will only happen once per Cabal version you're using.\n\ -\\n\ -\If anything goes horribly wrong just delete this directory and try again:\n\ -\ %s\n\ -\\n\ -\If you want to avoid this automatic installation altogether install\n\ -\version %s of Cabal manually (into your user or global package-db):\n\ -\ $ cabal install Cabal --constraint \"Cabal == %s\"\n\ -\\n\ -\Installing Cabal %s ...\n" appdir sver sver sver - - withSystemTempDirectory "cabal-helper-Cabal-source" $ \tmpdir -> do - (srcdir, cabalVer) <- case ever of - Left HEAD -> do - second CabalHEAD <$> unpackCabalHEAD tmpdir - Right ver -> do - message ver - let patch = fromMaybe nopCabalPatchDescription $ - find ((ver`elem`) . cpdVersions) patchyCabalVersions - (,) <$> unpackPatchedCabal ver tmpdir patch <*> pure (CabalVersion ver) - - db <- createPkgDb cabalVer - - runCabalInstall db srcdir ever - - return (db, cabalVer) - {- TODO: If the Cabal version we want to install is less than or equal to one we have available, either through act-as-setup or in a package-db we should be able @@ -453,197 +318,6 @@ Otherwise we might be able to use the shipped Setup.hs -} -runCabalInstall - :: Env => PackageDbDir -> CabalSourceDir -> Either HEAD Version-> IO () -runCabalInstall (PackageDbDir db) (CabalSourceDir srcdir) ever = do - civ@CabalInstallVersion {..} <- cabalInstallVersion - cabal_opts <- return $ concat - [ - [ "--package-db=clear" - , "--package-db=global" - , "--package-db=" ++ db - , "--prefix=" ++ db "prefix" - ] - , withGHCProgramOptions - , if cabalInstallVer >= Version [1,20,0,0] [] - then ["--no-require-sandbox"] - else [] - , [ "install", srcdir ] - , if ?verbose - then ["-v"] - else [] - , [ "--only-dependencies" ] - ] - - callProcessStderr (Just "/") oCabalProgram cabal_opts - - runSetupHs db srcdir ever civ - - hPutStrLn stderr "done" - -withGHCProgramOptions :: Env => [String] -withGHCProgramOptions = - concat [ [ "--with-ghc=" ++ ghcProgram ?cprogs ] - , if ghcProgram ?cprogs /= ghcPkgProgram defaultCompPrograms - then [ "--with-ghc-pkg=" ++ ghcPkgProgram ?cprogs ] - else [] - ] - -runSetupHs - :: Env - => FilePath - -> FilePath - -> Either HEAD Version - -> CabalInstallVersion - -> IO () -runSetupHs db srcdir ever CabalInstallVersion {..} - | cabalInstallVer >= parseVer "1.24" = do - go $ \args -> callProcessStderr (Just srcdir) oCabalProgram $ - [ "act-as-setup", "--" ] ++ args - | otherwise = do - SetupProgram {..} <- compileSetupHs db srcdir - go $ callProcessStderr (Just srcdir) setupProgram - where - parmake_opt :: Maybe Int -> [String] - parmake_opt nproc' - | Left _ <- ever = ["-j"++nproc] - | Right ver <- ever, ver >= Version [1,20] [] = ["-j"++nproc] - | otherwise = [] - where - nproc = fromMaybe "" $ show <$> nproc' - - go :: ([String] -> IO ()) -> IO () - go run = do - run $ [ "configure", "--package-db", db, "--prefix", db "prefix" ] - ++ withGHCProgramOptions - mnproc <- join . fmap readMaybe <$> lookupEnv "NPROC" - run $ [ "build" ] ++ parmake_opt mnproc - run [ "copy" ] - run [ "register" ] - - - - -newtype SetupProgram = SetupProgram { setupProgram :: FilePath } -compileSetupHs :: Env => FilePath -> FilePath -> IO SetupProgram -compileSetupHs db srcdir = do - ver <- ghcVersion - let no_version_macros - | ver >= Version [8] [] = [ "-fno-version-macros" ] - | otherwise = [] - - file = srcdir "Setup" - - callProcessStderr (Just srcdir) (ghcProgram ?cprogs) $ concat - [ [ "--make" - , "-package-conf", db - ] - , no_version_macros - , [ file <.> "hs" - , "-o", file - ] - ] - return $ SetupProgram file - -data CabalPatchDescription = CabalPatchDescription { - cpdVersions :: [Version], - cpdUnpackVariant :: UnpackCabalVariant, - cpdPatchFn :: FilePath -> IO () - } -nopCabalPatchDescription :: CabalPatchDescription -nopCabalPatchDescription = CabalPatchDescription [] LatestRevision (const (return ())) - -patchyCabalVersions :: [CabalPatchDescription] -patchyCabalVersions = [ - let versions = [ Version [1,18,1] [] ] - variant = Pristine - patch = fixArrayConstraint - in CabalPatchDescription versions variant patch, - - let versions = [ Version [1,18,0] [] ] - variant = Pristine - patch dir = do - fixArrayConstraint dir - fixOrphanInstance dir - in CabalPatchDescription versions variant patch, - - let versions = [ Version [1,24,1,0] [] ] - variant = Pristine - patch _ = return () - in CabalPatchDescription versions variant patch - ] - where - fixArrayConstraint dir = do - let cabalFile = dir "Cabal.cabal" - cabalFileTmp = cabalFile ++ ".tmp" - - cf <- readFile cabalFile - writeFile cabalFileTmp $ replace "&& < 0.5" "&& < 0.6" cf - renameFile cabalFileTmp cabalFile - - fixOrphanInstance dir = do - let versionFile = dir "Distribution/Version.hs" - versionFileTmp = versionFile ++ ".tmp" - - let languagePragma = - "{-# LANGUAGE DeriveDataTypeable, StandaloneDeriving #-}" - languagePragmaCPP = - "{-# LANGUAGE CPP, DeriveDataTypeable, StandaloneDeriving #-}" - - derivingDataVersion = - "deriving instance Data Version" - derivingDataVersionCPP = unlines [ - "#if __GLASGOW_HASKELL__ < 707", - derivingDataVersion, - "#endif" - ] - - vf <- readFile versionFile - writeFile versionFileTmp - $ replace derivingDataVersion derivingDataVersionCPP - $ replace languagePragma languagePragmaCPP vf - - renameFile versionFileTmp versionFile - -unpackPatchedCabal - :: Env - => Version - -> FilePath - -> CabalPatchDescription - -> IO CabalSourceDir -unpackPatchedCabal cabalVer tmpdir (CabalPatchDescription _ variant patch) = do - res@(CabalSourceDir dir) <- unpackCabal cabalVer tmpdir variant - patch dir - return res - -data UnpackCabalVariant = Pristine | LatestRevision -newtype CabalSourceDir = CabalSourceDir { unCabalSourceDir :: FilePath } -unpackCabal - :: Env => Version -> FilePath -> UnpackCabalVariant -> IO CabalSourceDir -unpackCabal cabalVer tmpdir variant = do - let cabal = "Cabal-" ++ showVersion cabalVer - dir = tmpdir cabal - variant_opts = case variant of Pristine -> [ "--pristine" ]; _ -> [] - args = [ "get", cabal ] ++ variant_opts - callProcessStderr (Just tmpdir) oCabalProgram args - return $ CabalSourceDir dir - -unpackCabalHEAD :: Env => FilePath -> IO (CabalSourceDir, CommitId) -unpackCabalHEAD tmpdir = do - let dir = tmpdir "cabal-head.git" - url = "https://github.com/haskell/cabal.git" - ExitSuccess <- rawSystem "git" [ "clone", "--depth=1", url, dir] - commit <- - withDirectory_ dir $ trim <$> readProcess' "git" ["rev-parse", "HEAD"] "" - return (CabalSourceDir $ dir "Cabal", CommitId commit) - where - withDirectory_ :: FilePath -> IO a -> IO a - withDirectory_ dir action = - bracket - (liftIO getCurrentDirectory) - (liftIO . setCurrentDirectory) - (\_ -> liftIO (setCurrentDirectory dir) >> action) - errorInstallCabal :: Version -> IO a errorInstallCabal cabalVer = panicIO $ printf "\ \Installing Cabal version %s failed.\n\ @@ -679,62 +353,6 @@ errorInstallCabal cabalVer = panicIO $ printf "\ where sver = showVersion cabalVer -listCabalVersions' :: Env => Maybe PackageDbDir -> MaybeT IO [Version] -listCabalVersions' mdb = do - let mdb_path = unPackageDbDir <$> mdb - exists <- fromMaybe True <$> - traverse (liftIO . doesDirectoryExist) mdb_path - case exists of - True -> MaybeT $ logIOError "listCabalVersions" $ Just <$> do - let mdbopt = ("--package-conf="++) <$> mdb_path - args = ["list", "--simple-output", "Cabal"] ++ maybeToList mdbopt - catMaybes . map (fmap snd . parsePkgId . fromString) . words - <$> readProcess' (ghcPkgProgram ?cprogs) args "" - _ -> mzero - -cabalVersionExistsInPkgDb :: Env => Version -> PackageDbDir -> IO Bool -cabalVersionExistsInPkgDb cabalVer db@(PackageDbDir db_path) = do - exists <- doesDirectoryExist db_path - case exists of - False -> return False - True -> fromMaybe False <$> runMaybeT (do - vers <- listCabalVersions' (Just db) - return $ cabalVer `elem` vers) - -ghcVersion :: (Verbose, CProgs) => IO Version -ghcVersion = do - parseVer . trim <$> readProcess' (ghcProgram ?cprogs) ["--numeric-version"] "" - -ghcPkgVersion :: (Verbose, CProgs) => IO Version -ghcPkgVersion = - parseVer . trim . dropWhile (not . isDigit) - <$> readProcess' (ghcPkgProgram ?cprogs) ["--version"] "" - -newtype CabalInstallVersion = CabalInstallVersion { cabalInstallVer :: Version } -cabalInstallVersion :: Env => IO CabalInstallVersion -cabalInstallVersion = do - CabalInstallVersion . parseVer . trim - <$> readProcess' oCabalProgram ["--numeric-version"] "" - -createPkgDb :: (Verbose, CProgs) => CabalVersion -> IO PackageDbDir -createPkgDb cabalVer = do - db@(PackageDbDir db_path) <- getPrivateCabalPkgDb cabalVer - exists <- doesDirectoryExist db_path - when (not exists) $ - callProcessStderr Nothing (ghcPkgProgram ?cprogs) ["init", db_path] - return db - -getPrivateCabalPkgDb :: (Verbose, CProgs) => CabalVersion -> IO PackageDbDir -getPrivateCabalPkgDb cabalVer = do - appdir <- appCacheDir - ghcVer <- ghcVersion - let db_path = appdir exeName cabalVer - ++ "-ghc" ++ showVersion ghcVer - ++ ".package-db" - return $ PackageDbDir db_path - --- "Cabal" ++ ver ++ "-ghc" ++ showVersion ghcVer - -- | Find @version: XXX@ delcaration in a cabal file cabalFileVersion :: String -> Version cabalFileVersion = parseVer . cabalFileTopField "version" @@ -749,14 +367,3 @@ cabalFileTopField field cabalFile = value Just value = extract <$> find ((field++":") `isPrefixOf`) ls ls = map (map toLower) $ lines cabalFile extract = dropWhile (/=':') >>> drop 1 >>> dropWhile isSpace >>> takeWhile (not . isSpace) - -vLog :: (MonadIO m, Verbose) => String -> m () -vLog msg - | ?verbose = liftIO $ hPutStrLn stderr msg - | otherwise = return () - -logIOError :: Verbose => String -> IO (Maybe a) -> IO (Maybe a) -logIOError label a = do - a `catchIOError` \ex -> do - vLog $ label ++ ": " ++ show ex - return Nothing diff --git a/src/CabalHelper/Compiletime/Log.hs b/src/CabalHelper/Compiletime/Log.hs new file mode 100644 index 0000000..eefb30e --- /dev/null +++ b/src/CabalHelper/Compiletime/Log.hs @@ -0,0 +1,40 @@ +-- cabal-helper: Simple interface to Cabal's configuration state +-- Copyright (C) 2018 Daniel Gröber +-- +-- This program is free software: you can redistribute it and/or modify +-- it under the terms of the GNU General Public License as published by +-- the Free Software Foundation, either version 3 of the License, or +-- (at your option) any later version. +-- +-- This program is distributed in the hope that it will be useful, +-- but WITHOUT ANY WARRANTY; without even the implied warranty of +-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the +-- GNU General Public License for more details. +-- +-- You should have received a copy of the GNU General Public License +-- along with this program. If not, see . + +{-| +Module : CabalHelper.Compiletime.Log +Description : Logging utilities +License : GPL-3 +-} + +module CabalHelper.Compiletime.Log where + +import Control.Monad.IO.Class +import System.IO +import System.IO.Error + +import CabalHelper.Compiletime.Types + +logIOError :: Verbose => String -> IO (Maybe a) -> IO (Maybe a) +logIOError label a = do + a `catchIOError` \ex -> do + vLog $ label ++ ": " ++ show ex + return Nothing + +vLog :: (MonadIO m, Verbose) => String -> m () +vLog msg + | ?verbose = liftIO $ hPutStrLn stderr msg + | otherwise = return () diff --git a/src/CabalHelper/Compiletime/Process.hs b/src/CabalHelper/Compiletime/Process.hs new file mode 100644 index 0000000..43c3cd5 --- /dev/null +++ b/src/CabalHelper/Compiletime/Process.hs @@ -0,0 +1,76 @@ +-- cabal-helper: Simple interface to Cabal's configuration state +-- Copyright (C) 2018 Daniel Gröber +-- +-- This program is free software: you can redistribute it and/or modify +-- it under the terms of the GNU General Public License as published by +-- the Free Software Foundation, either version 3 of the License, or +-- (at your option) any later version. +-- +-- This program is distributed in the hope that it will be useful, +-- but WITHOUT ANY WARRANTY; without even the implied warranty of +-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the +-- GNU General Public License for more details. +-- +-- You should have received a copy of the GNU General Public License +-- along with this program. If not, see . + +{-| +Module : CabalHelper.Compiletime.Process +Description : System process utilities +License : GPL-3 +-} + +module CabalHelper.Compiletime.Process + ( module CabalHelper.Compiletime.Process + , module System.Process + ) where + +import Data.Char +import Data.List +import GHC.IO.Exception (IOErrorType(OtherError)) +import System.IO +import System.IO.Error +import System.Exit +import System.Process + +import CabalHelper.Compiletime.Types +import CabalHelper.Compiletime.Log + +readProcess' :: Verbose => FilePath -> [String] -> String -> IO String +readProcess' exe args inp = do + vLog $ intercalate " " $ map formatProcessArg (exe:args) + outp <- readProcess exe args inp + vLog $ unlines $ map ("=> "++) $ lines outp + return outp + + +callProcessStderr' + :: Verbose => Maybe FilePath -> FilePath -> [String] -> IO ExitCode +callProcessStderr' mwd exe args = do + let cd = case mwd of + Nothing -> []; Just wd -> [ "cd", formatProcessArg wd++";" ] + vLog $ intercalate " " $ cd ++ map formatProcessArg (exe:args) + (_, _, _, h) <- createProcess (proc exe args) { std_out = UseHandle stderr + , cwd = mwd } + waitForProcess h + +callProcessStderr :: Verbose => Maybe FilePath -> FilePath -> [String] -> IO () +callProcessStderr mwd exe args = do + rv <- callProcessStderr' mwd exe args + case rv of + ExitSuccess -> return () + ExitFailure v -> processFailedException "callProcessStderr" exe args v + +processFailedException :: String -> String -> [String] -> Int -> IO a +processFailedException fn exe args rv = + ioError $ mkIOError OtherError msg Nothing Nothing + where + msg = concat [ fn, ": ", exe, " " + , intercalate " " (map formatProcessArg args) + , " (exit " ++ show rv ++ ")" + ] + +formatProcessArg :: String -> String +formatProcessArg xs + | any isSpace xs = "'"++ xs ++"'" + | otherwise = xs diff --git a/src/CabalHelper/Compiletime/Program/CabalInstall.hs b/src/CabalHelper/Compiletime/Program/CabalInstall.hs new file mode 100644 index 0000000..a4df188 --- /dev/null +++ b/src/CabalHelper/Compiletime/Program/CabalInstall.hs @@ -0,0 +1,209 @@ +-- cabal-helper: Simple interface to Cabal's configuration state +-- Copyright (C) 2018 Daniel Gröber +-- +-- This program is free software: you can redistribute it and/or modify +-- it under the terms of the GNU General Public License as published by +-- the Free Software Foundation, either version 3 of the License, or +-- (at your option) any later version. +-- +-- This program is distributed in the hope that it will be useful, +-- but WITHOUT ANY WARRANTY; without even the implied warranty of +-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the +-- GNU General Public License for more details. +-- +-- You should have received a copy of the GNU General Public License +-- along with this program. If not, see . + +{-| +Module : CabalHelper.Compiletime.Program.Cabal +Description : cabal-install program interface +License : GPL-3 +-} + +module CabalHelper.Compiletime.Program.CabalInstall where + +import qualified Cabal.Plan as CP +import Control.Arrow +import Control.Monad +import Data.Coerce +import Data.Either +import Data.Maybe +import Data.Version +import System.IO +import System.IO.Temp +import System.Environment +import System.FilePath +import Text.Printf +import Text.Read +import Text.Show.Pretty + +import qualified Data.Map.Strict as Map +import qualified Data.Text as Text + +import qualified CabalHelper.Compiletime.Cabal as Cabal +import CabalHelper.Compiletime.Types +import CabalHelper.Compiletime.Program.GHC + ( ghcVersion, createPkgDb ) +import CabalHelper.Compiletime.Cabal + ( CabalSourceDir(..), CabalVersion(..), unpackCabalHEAD, unpackPatchedCabal ) +import CabalHelper.Compiletime.Process +import CabalHelper.Shared.Common + ( parseVer, trim, appCacheDir, panicIO ) + +newtype CabalInstallVersion = CabalInstallVersion { cabalInstallVer :: Version } + +data HEAD = HEAD deriving (Eq, Show) + +cabalInstallVersion :: (Verbose, Progs) => IO CabalInstallVersion +cabalInstallVersion = do + CabalInstallVersion . parseVer . trim + <$> readProcess' (cabalProgram ?progs) ["--numeric-version"] "" + +installCabalLib :: Env => Either HEAD Version -> IO (PackageDbDir, CabalVersion) +installCabalLib ever = do + appdir <- appCacheDir + let message ver = do + let sver = showVersion ver + hPutStr stderr $ printf "\ +\cabal-helper: Installing a private copy of Cabal because we couldn't\n\ +\find the right version in your global/user package-db. This might take a\n\ +\while but will only happen once per Cabal version you're using.\n\ +\\n\ +\If anything goes horribly wrong just delete this directory and try again:\n\ +\ %s\n\ +\\n\ +\If you want to avoid this automatic installation altogether install\n\ +\version %s of Cabal manually (into your user or global package-db):\n\ +\ $ cabal install Cabal --constraint \"Cabal == %s\"\n\ +\\n\ +\Installing Cabal %s ...\n" appdir sver sver sver + withSystemTempDirectory "cabal-helper-Cabal-source" $ \tmpdir -> do + (srcdir, cabalVer) <- case ever of + Left HEAD -> do + second CabalHEAD <$> unpackCabalHEAD tmpdir + Right ver -> do + message ver + (,) <$> unpackPatchedCabal ver tmpdir <*> pure (CabalVersion ver) + + db <- createPkgDb cabalVer + + callCabalInstall db srcdir ever + + return (db, cabalVer) + +callCabalInstall + :: Env => PackageDbDir -> CabalSourceDir -> Either HEAD Version-> IO () +callCabalInstall (PackageDbDir db) (CabalSourceDir srcdir) ever = do + civ@CabalInstallVersion {..} <- cabalInstallVersion + cabal_opts <- return $ concat + [ + [ "--package-db=clear" + , "--package-db=global" + , "--package-db=" ++ db + , "--prefix=" ++ db "prefix" + ] + , cabalWithGHCProgOpts + , if cabalInstallVer >= Version [1,20,0,0] [] + then ["--no-require-sandbox"] + else [] + , [ "install", srcdir ] + , if ?verbose + then ["-v"] + else [] + , [ "--only-dependencies" ] + ] + + callProcessStderr (Just "/") (cabalProgram ?progs) cabal_opts + + runSetupHs db srcdir ever civ + + hPutStrLn stderr "done" + +runSetupHs + :: Env + => FilePath + -> FilePath + -> Either HEAD Version + -> CabalInstallVersion + -> IO () +runSetupHs db srcdir ever CabalInstallVersion {..} + | cabalInstallVer >= parseVer "1.24" = do + go $ \args -> callProcessStderr (Just srcdir) (cabalProgram ?progs) $ + [ "act-as-setup", "--" ] ++ args + | otherwise = do + SetupProgram {..} <- compileSetupHs db srcdir + go $ callProcessStderr (Just srcdir) setupProgram + where + parmake_opt :: Maybe Int -> [String] + parmake_opt nproc' + | Left _ <- ever = ["-j"++nproc] + | Right ver <- ever, ver >= Version [1,20] [] = ["-j"++nproc] + | otherwise = [] + where + nproc = fromMaybe "" $ show <$> nproc' + go :: ([String] -> IO ()) -> IO () + go run = do + run $ [ "configure", "--package-db", db, "--prefix", db "prefix" ] + ++ cabalWithGHCProgOpts + mnproc <- join . fmap readMaybe <$> lookupEnv "NPROC" + run $ [ "build" ] ++ parmake_opt mnproc + run [ "copy" ] + run [ "register" ] + +newtype SetupProgram = SetupProgram { setupProgram :: FilePath } +compileSetupHs :: Env => FilePath -> FilePath -> IO SetupProgram +compileSetupHs db srcdir = do + ver <- ghcVersion + let no_version_macros + | ver >= Version [8] [] = [ "-fno-version-macros" ] + | otherwise = [] + + file = srcdir "Setup" + + callProcessStderr (Just srcdir) (ghcProgram ?cprogs) $ concat + [ [ "--make" + , "-package-conf", db + ] + , no_version_macros + , [ file <.> "hs" + , "-o", file + ] + ] + return $ SetupProgram file + +cabalWithGHCProgOpts :: Progs => [String] +cabalWithGHCProgOpts = concat + [ [ "--with-ghc=" ++ ghcProgram ?cprogs ] + -- Only pass ghc-pkg if it was actually set otherwise we + -- might break cabal's guessing logic + , if ghcPkgProgram ?cprogs /= ghcPkgProgram defaultCompPrograms + then [ "--with-ghc-pkg=" ++ ghcPkgProgram ?cprogs ] + else [] + ] + +planUnits :: CP.PlanJson -> IO [Unit] +planUnits plan = do + units <- fmap catMaybes $ mapM takeunit $ Map.elems $ CP.pjUnits plan + case lefts units of + [] -> return $ rights units + us@(_:_) -> panicIO $ + msg ++ (concat $ map (unlines . map (" "++) . lines . ppShow) us) + where + msg = "\ +\plan.json doesn't contain 'dist-dir' key for the following local units:\n" + takeunit u@CP.Unit + { uType=CP.UnitTypeLocal + , uDistDir=Just distdirv1 + , uPkgSrc=Just (CP.LocalUnpackedPackage pkgdir) + } = do + cabal_file <- Cabal.findCabalFile pkgdir + return $ Just $ Right $ Unit + { uUnitId = UnitId $ Text.unpack (coerce (CP.uId u)) + , uPackageDir = pkgdir + , uCabalFile = CabalFile cabal_file + , uDistDir = DistDirLib distdirv1 + } + takeunit u@CP.Unit {uType=CP.UnitTypeLocal} = + return $ Just $ Left u + takeunit _ = + return $ Nothing diff --git a/src/CabalHelper/Compiletime/Program/GHC.hs b/src/CabalHelper/Compiletime/Program/GHC.hs new file mode 100644 index 0000000..8c77f62 --- /dev/null +++ b/src/CabalHelper/Compiletime/Program/GHC.hs @@ -0,0 +1,125 @@ +-- cabal-helper: Simple interface to Cabal's configuration state +-- Copyright (C) 2018 Daniel Gröber +-- +-- This program is free software: you can redistribute it and/or modify +-- it under the terms of the GNU General Public License as published by +-- the Free Software Foundation, either version 3 of the License, or +-- (at your option) any later version. +-- +-- This program is distributed in the hope that it will be useful, +-- but WITHOUT ANY WARRANTY; without even the implied warranty of +-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the +-- GNU General Public License for more details. +-- +-- You should have received a copy of the GNU General Public License +-- along with this program. If not, see . + +{-| +Module : CabalHelper.Compiletime.Program.GHC +Description : GHC program interface +License : GPL-3 +-} + +module CabalHelper.Compiletime.Program.GHC where + +import Control.Monad +import Control.Monad.Trans.Maybe +import Control.Monad.IO.Class +import Data.Char +import Data.List +import Data.String +import Data.Maybe +import Data.Version +import System.Exit +import System.FilePath +import System.Directory + +import CabalHelper.Shared.Common + (parseVer, trim, appCacheDir, parsePkgId) +import CabalHelper.Compiletime.Types +import CabalHelper.Compiletime.Cabal + (CabalVersion(..), showCabalVersion) +import CabalHelper.Compiletime.Process +import CabalHelper.Compiletime.Log + +data GhcInvocation = GhcInvocation + { giOutDir :: FilePath + , giOutput :: FilePath + , giCPPOptions :: [String] + , giPackageDBs :: [PackageDbDir] + , giIncludeDirs :: [FilePath] + , giHideAllPackages :: Bool + , giPackages :: [String] + , giWarningFlags :: [String] + , giInputs :: [String] + } + +ghcVersion :: (Verbose, CProgs) => IO Version +ghcVersion = + parseVer . trim <$> readProcess' (ghcProgram ?cprogs) ["--numeric-version"] "" + +ghcPkgVersion :: (Verbose, CProgs) => IO Version +ghcPkgVersion = + parseVer . trim . dropWhile (not . isDigit) + <$> readProcess' (ghcPkgProgram ?cprogs) ["--version"] "" + +createPkgDb :: (Verbose, CProgs) => CabalVersion -> IO PackageDbDir +createPkgDb cabalVer = do + db@(PackageDbDir db_path) <- getPrivateCabalPkgDb cabalVer + exists <- doesDirectoryExist db_path + when (not exists) $ + callProcessStderr Nothing (ghcPkgProgram ?cprogs) ["init", db_path] + return db + +getPrivateCabalPkgDb :: (Verbose, CProgs) => CabalVersion -> IO PackageDbDir +getPrivateCabalPkgDb cabalVer = do + appdir <- appCacheDir + ghcVer <- ghcVersion + let db_path = + appdir "ghc-" ++ showVersion ghcVer ++ ".package-db" + "Cabal-" ++ showCabalVersion cabalVer + return $ PackageDbDir db_path + +listCabalVersions + :: (Verbose, Progs) => Maybe PackageDbDir -> MaybeT IO [Version] +listCabalVersions mdb = do + let mdb_path = unPackageDbDir <$> mdb + exists <- fromMaybe True <$> + traverse (liftIO . doesDirectoryExist) mdb_path + case exists of + True -> MaybeT $ logIOError "listCabalVersions" $ Just <$> do + let mdbopt = ("--package-conf="++) <$> mdb_path + args = ["list", "--simple-output", "Cabal"] ++ maybeToList mdbopt + catMaybes . map (fmap snd . parsePkgId . fromString) . words + <$> readProcess' (ghcPkgProgram ?cprogs) args "" + _ -> mzero + +cabalVersionExistsInPkgDb + :: (Verbose, Progs) => Version -> PackageDbDir -> IO Bool +cabalVersionExistsInPkgDb cabalVer db@(PackageDbDir db_path) = do + exists <- doesDirectoryExist db_path + case exists of + False -> return False + True -> fromMaybe False <$> runMaybeT (do + vers <- listCabalVersions (Just db) + return $ cabalVer `elem` vers) + +invokeGhc :: Env => GhcInvocation -> IO (Either ExitCode FilePath) +invokeGhc GhcInvocation {..} = do + rv <- callProcessStderr' Nothing (ghcProgram ?cprogs) $ concat + [ [ "-outputdir", giOutDir + , "-o", giOutput + ] + , map ("-optP"++) giCPPOptions + , map ("-package-conf="++) $ unPackageDbDir <$> giPackageDBs + , map ("-i"++) $ nub $ "" : giIncludeDirs + , if giHideAllPackages then ["-hide-all-packages"] else [] + , concatMap (\p -> ["-package", p]) giPackages + , giWarningFlags + , ["--make"] + , giInputs + ] + return $ + case rv of + ExitSuccess -> Right giOutput + e@(ExitFailure _) -> Left e diff --git a/src/CabalHelper/Compiletime/Program/Stack.hs b/src/CabalHelper/Compiletime/Program/Stack.hs index 322ccaf..4f3680f 100644 --- a/src/CabalHelper/Compiletime/Program/Stack.hs +++ b/src/CabalHelper/Compiletime/Program/Stack.hs @@ -20,7 +20,7 @@ Description : Stack program interface License : GPL-3 -} -{-# LANGUAGE NamedFieldPuns, GADTs, DataKinds #-} +{-# LANGUAGE GADTs, DataKinds #-} module CabalHelper.Compiletime.Program.Stack where diff --git a/src/CabalHelper/Compiletime/Types.hs b/src/CabalHelper/Compiletime/Types.hs index 88f11f6..cb2fbda 100644 --- a/src/CabalHelper/Compiletime/Types.hs +++ b/src/CabalHelper/Compiletime/Types.hs @@ -15,8 +15,7 @@ -- along with this program. If not, see . {-# LANGUAGE DeriveGeneric, DeriveDataTypeable, DefaultSignatures, - StandaloneDeriving, GADTs, DataKinds, KindSignatures, ImplicitParams, - ConstraintKinds, RankNTypes #-} + StandaloneDeriving, GADTs, DataKinds, KindSignatures, RankNTypes #-} {-| Module : CabalHelper.Compiletime.Types diff --git a/src/CabalHelper/Shared/Common.hs b/src/CabalHelper/Shared/Common.hs index d60e745..4165ab0 100644 --- a/src/CabalHelper/Shared/Common.hs +++ b/src/CabalHelper/Shared/Common.hs @@ -134,15 +134,6 @@ appCacheDir = windowsCache = "Local Settings" "Cache" unixCache = ".cache" -isCabalFile :: FilePath -> Bool -isCabalFile f = takeExtension' f == ".cabal" - -takeExtension' :: FilePath -> String -takeExtension' p = - if takeFileName p == takeExtension p - then "" -- just ".cabal" is not a valid cabal file - else takeExtension p - replace :: String -> String -> String -> String replace n r hs' = go "" hs' where -- cgit v1.2.3