ghcup-hs/app/ghcup/GHCup/OptParse/GC.hs

143 lines
3.3 KiB
Haskell
Raw Normal View History

2021-10-15 20:24:23 +00:00
{-# LANGUAGE CPP #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE RankNTypes #-}
module GHCup.OptParse.GC where
import GHCup
import GHCup.Errors
import GHCup.Types
2022-05-21 20:54:18 +00:00
import GHCup.Prelude.Logger
import GHCup.Prelude.String.QQ
2021-10-15 20:24:23 +00:00
#if !MIN_VERSION_base(4,13,0)
import Control.Monad.Fail ( MonadFail )
#endif
import Control.Monad.Reader
import Control.Monad.Trans.Resource
import Data.Functor
import Haskus.Utils.Variant.Excepts
import Options.Applicative hiding ( style )
import Prelude hiding ( appendFile )
import System.Exit
import qualified Data.Text as T
import Control.Exception.Safe (MonadMask)
---------------
--[ Options ]--
---------------
data GCOptions = GCOptions
{ gcOldGHC :: Bool
, gcProfilingLibs :: Bool
, gcShareDir :: Bool
, gcHLSNoGHC :: Bool
, gcCache :: Bool
, gcTmp :: Bool
2023-07-28 15:26:19 +00:00
} deriving (Eq, Show)
2021-10-15 20:24:23 +00:00
---------------
--[ Parsers ]--
---------------
2022-05-20 21:19:33 +00:00
2021-10-15 20:24:23 +00:00
gcP :: Parser GCOptions
gcP =
GCOptions
2022-05-20 21:19:33 +00:00
<$>
2021-10-15 20:24:23 +00:00
switch
(short 'o' <> long "ghc-old" <> help "Remove GHC versions marked as 'old'")
2022-05-20 21:19:33 +00:00
<*>
2021-10-15 20:24:23 +00:00
switch
(short 'p' <> long "profiling-libs" <> help "Remove profiling libs of GHC versions")
2022-05-20 21:19:33 +00:00
<*>
2021-10-15 20:24:23 +00:00
switch
(short 's' <> long "share-dir" <> help "Remove GHC share directories (documentation)")
2022-05-20 21:19:33 +00:00
<*>
2021-10-15 20:24:23 +00:00
switch
(short 'h' <> long "hls-no-ghc" <> help "Remove HLS versions that don't have a corresponding installed GHC version")
2022-05-20 21:19:33 +00:00
<*>
2021-10-15 20:24:23 +00:00
switch
(short 'c' <> long "cache" <> help "GC the GHCup cache")
2022-05-20 21:19:33 +00:00
<*>
2021-10-15 20:24:23 +00:00
switch
(short 't' <> long "tmpdirs" <> help "Remove tmpdir leftovers")
--------------
--[ Footer ]--
--------------
gcFooter :: String
gcFooter = [s|Discussion:
Performs garbage collection. If no switches are specified, does nothing.|]
---------------------------
--[ Effect interpreters ]--
---------------------------
type GCEffects = '[ NotInstalled, UninstallFailed ]
2021-10-15 20:24:23 +00:00
runGC :: MonadUnliftIO m
=> (ReaderT AppState m (VEither GCEffects a) -> m (VEither GCEffects a))
-> Excepts GCEffects (ResourceT (ReaderT AppState m)) a
-> m (VEither GCEffects a)
runGC runAppState =
runAppState
. runResourceT
. runE
@GCEffects
------------------
--[ Entrypoint ]--
------------------
gc :: ( Monad m
, MonadMask m
, MonadUnliftIO m
, MonadFail m
)
=> GCOptions
-> (forall a. ReaderT AppState m (VEither GCEffects a) -> m (VEither GCEffects a))
-> (ReaderT LeanAppState m () -> m ())
-> m ExitCode
gc GCOptions{..} runAppState runLogger = runGC runAppState (do
when gcOldGHC (liftE rmOldGHC)
2021-10-15 20:24:23 +00:00
lift $ when gcProfilingLibs rmProfilingLibs
lift $ when gcShareDir rmShareDir
2022-02-05 18:12:13 +00:00
liftE $ when gcHLSNoGHC rmHLSNoGHC
2021-10-15 20:24:23 +00:00
lift $ when gcCache rmCache
lift $ when gcTmp rmTmp
) >>= \case
VRight _ -> do
pure ExitSuccess
VLeft e -> do
runLogger $ logError $ T.pack $ prettyHFError e
2021-10-15 20:24:23 +00:00
pure $ ExitFailure 27