diff options
| author | Daniel Gröber <dxld@darkboxed.org> | 2018-10-26 04:21:38 +0200 | 
|---|---|---|
| committer | Daniel Gröber <dxld@darkboxed.org> | 2018-10-27 20:48:56 +0200 | 
| commit | 914d428ff1a1529b98206f9f3575c88ade7ea38b (patch) | |
| tree | 50773c24714b73ab1a655ee3cc344d4b1655d44a /src/CabalHelper/Compiletime/Program | |
| parent | 385685dc9da4d95e39e17a323a69d12f1204c951 (diff) | |
Split up Compile.hs into multiple modules
Diffstat (limited to 'src/CabalHelper/Compiletime/Program')
| -rw-r--r-- | src/CabalHelper/Compiletime/Program/CabalInstall.hs | 209 | ||||
| -rw-r--r-- | src/CabalHelper/Compiletime/Program/GHC.hs | 125 | ||||
| -rw-r--r-- | src/CabalHelper/Compiletime/Program/Stack.hs | 2 | 
3 files changed, 335 insertions, 1 deletions
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 <cabal-helper@dxld.at> +-- +-- 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 <http://www.gnu.org/licenses/>. + +{-| +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 <cabal-helper@dxld.at> +-- +-- 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 <http://www.gnu.org/licenses/>. + +{-| +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  | 
