module Distribution.Client.Reconfigure (Check (..), reconfigure) where

import Distribution.Client.Compat.Prelude

import Data.Monoid (Any (..))
import System.Directory (doesFileExist)

import Distribution.Simple.Configure (localBuildInfoFile)
import Distribution.Simple.Setup (Flag, flagToMaybe, toFlag)
import Distribution.Simple.Utils
  ( defaultPackageDesc
  , existsAndIsMoreRecentThan
  , info
  )

import Distribution.Client.Config (SavedConfig (..))
import Distribution.Client.Configure (readConfigFlags)
import Distribution.Client.Nix (findNixExpr, inNixShell, nixInstantiate)
import Distribution.Client.Sandbox (findSavedDistPref, updateInstallDirs)
import Distribution.Client.Sandbox.PackageEnvironment
  ( userPackageEnvironmentFile
  )
import Distribution.Client.Setup
  ( ConfigExFlags
  , ConfigFlags (..)
  , GlobalFlags (..)
  )

-- | @Check@ represents a function to check some condition on type @a@. The
-- returned 'Any' is 'True' if any part of the condition failed.
newtype Check a = Check
  { forall a. Check a -> Any -> a -> IO (Any, a)
runCheck
      :: Any -- Did any previous check fail?
      -> a -- value returned by previous checks
      -> IO (Any, a) -- Did this check fail? What value is returned?
  }

instance Semigroup (Check a) where
  <> :: Check a -> Check a -> Check a
(<>) Check a
c Check a
d = (Any -> a -> IO (Any, a)) -> Check a
forall a. (Any -> a -> IO (Any, a)) -> Check a
Check ((Any -> a -> IO (Any, a)) -> Check a)
-> (Any -> a -> IO (Any, a)) -> Check a
forall a b. (a -> b) -> a -> b
$ \Any
any0 a
a0 -> do
    (any1, a1) <- Check a -> Any -> a -> IO (Any, a)
forall a. Check a -> Any -> a -> IO (Any, a)
runCheck Check a
c Any
any0 a
a0
    (any2, a2) <- runCheck d (any0 <> any1) a1
    return (any0 <> any1 <> any2, a2)

instance Monoid (Check a) where
  mempty :: Check a
mempty = (Any -> a -> IO (Any, a)) -> Check a
forall a. (Any -> a -> IO (Any, a)) -> Check a
Check ((Any -> a -> IO (Any, a)) -> Check a)
-> (Any -> a -> IO (Any, a)) -> Check a
forall a b. (a -> b) -> a -> b
$ \Any
_ a
a -> (Any, a) -> IO (Any, a)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Any
forall a. Monoid a => a
mempty, a
a)
  mappend :: Check a -> Check a -> Check a
mappend = Check a -> Check a -> Check a
forall a. Semigroup a => a -> a -> a
(<>)

-- | Re-configure the package in the current directory if needed. Deciding
-- when to reconfigure and with which options is convoluted:
--
-- If we are reconfiguring, we must always run @configure@ with the
-- verbosity option we are given; however, that a previous configuration
-- uses a different verbosity setting is not reason enough to reconfigure.
--
-- The package should be configured to use the same \"dist\" prefix as
-- given to the @build@ command, otherwise the build will probably
-- fail. Not only does this determine the \"dist\" prefix setting if we
-- need to reconfigure anyway, but an existing configuration should be
-- invalidated if its \"dist\" prefix differs.
--
-- If the package has never been configured (i.e., there is no
-- LocalBuildInfo), we must configure first, using the default options.
--
-- If the package has been configured, there will be a 'LocalBuildInfo'.
-- If there no package description file, we assume that the
-- 'PackageDescription' is up to date, though the configuration may need
-- to be updated for other reasons (see above). If there is a package
-- description file, and it has been modified since the 'LocalBuildInfo'
-- was generated, then we need to reconfigure.
--
-- The caller of this function may also have specific requirements
-- regarding the flags the last configuration used. For example,
-- 'testAction' requires that the package be configured with test suites
-- enabled. The caller may pass the required settings to this function
-- along with a function to check the validity of the saved 'ConfigFlags';
-- these required settings will be checked first upon determining that
-- a previous configuration exists.
reconfigure
  :: ((ConfigFlags, ConfigExFlags) -> [String] -> GlobalFlags -> IO ())
  -- ^ configure action
  -> Verbosity
  -- ^ Verbosity setting
  -> FilePath
  -- ^ \"dist\" prefix
  -> Flag (Maybe Int)
  -- ^ -j flag for reinstalling add-source deps.
  -> Check (ConfigFlags, ConfigExFlags)
  -- ^ Check that the required flags are set.
  -- If they are not set, provide a message explaining the
  -- reason for reconfiguration.
  -> [String]
  -- ^ Extra arguments
  -> GlobalFlags
  -- ^ Global flags
  -> SavedConfig
  -> IO SavedConfig
reconfigure :: ((ConfigFlags, ConfigExFlags) -> [String] -> GlobalFlags -> IO ())
-> Verbosity
-> String
-> Flag (Maybe Int)
-> Check (ConfigFlags, ConfigExFlags)
-> [String]
-> GlobalFlags
-> SavedConfig
-> IO SavedConfig
reconfigure
  (ConfigFlags, ConfigExFlags) -> [String] -> GlobalFlags -> IO ()
configureAction
  Verbosity
verbosity
  String
dist
  Flag (Maybe Int)
_numJobsFlag
  Check (ConfigFlags, ConfigExFlags)
check
  [String]
extraArgs
  GlobalFlags
globalFlags
  SavedConfig
config =
    do
      savedFlags@(_, _) <- String -> IO (ConfigFlags, ConfigExFlags)
readConfigFlags String
dist

      useNix <- fmap isJust (findNixExpr globalFlags config)
      alreadyInNixShell <- inNixShell

      if useNix && not alreadyInNixShell
        then do
          -- If we are using Nix, we must reinstantiate the derivation outside
          -- the shell. Eventually, the caller will invoke 'nixShell' which will
          -- rerun cabal inside the shell. That will bring us back to 'reconfigure',
          -- but inside the shell we'll take the second branch, below.

          -- This seems to have a problem: won't 'configureAction' call 'nixShell'
          -- yet again, spawning an infinite tree of subprocesses?
          -- No, because 'nixShell' doesn't spawn a new process if it is already
          -- running in a Nix shell.

          nixInstantiate verbosity dist False globalFlags config
          return config
        else do
          let checks :: Check (ConfigFlags, ConfigExFlags)
              checks =
                Check (ConfigFlags, ConfigExFlags)
forall b. Check (ConfigFlags, b)
checkVerb
                  Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
forall a. Semigroup a => a -> a -> a
<> Check (ConfigFlags, ConfigExFlags)
forall b. Check (ConfigFlags, b)
checkDist
                  Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
forall a. Semigroup a => a -> a -> a
<> Check (ConfigFlags, ConfigExFlags)
forall b. Check (ConfigFlags, b)
checkOutdated
                  Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
-> Check (ConfigFlags, ConfigExFlags)
forall a. Semigroup a => a -> a -> a
<> Check (ConfigFlags, ConfigExFlags)
check
          (Any frc, flags@(configFlags, _)) <- runCheck checks mempty savedFlags

          let config' :: SavedConfig
              config' = Flag Bool -> SavedConfig -> SavedConfig
updateInstallDirs (ConfigFlags -> Flag Bool
configUserInstall ConfigFlags
configFlags) SavedConfig
config

          when frc $ configureAction flags extraArgs globalFlags
          return config'
    where
      -- Changing the verbosity does not require reconfiguration, but the new
      -- verbosity should be used if reconfiguring.
      checkVerb :: Check (ConfigFlags, b)
      checkVerb :: forall b. Check (ConfigFlags, b)
checkVerb = (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a. (Any -> a -> IO (Any, a)) -> Check a
Check ((Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
 -> Check (ConfigFlags, b))
-> (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a b. (a -> b) -> a -> b
$ \Any
_ (ConfigFlags
configFlags, b
configExFlags) -> do
        let configFlags' :: ConfigFlags
            configFlags' :: ConfigFlags
configFlags' = ConfigFlags
configFlags{configVerbosity = toFlag verbosity}
        (Any, (ConfigFlags, b)) -> IO (Any, (ConfigFlags, b))
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Any
forall a. Monoid a => a
mempty, (ConfigFlags
configFlags', b
configExFlags))

      -- Reconfiguration is required if @--build-dir@ changes.
      checkDist :: Check (ConfigFlags, b)
      checkDist :: forall b. Check (ConfigFlags, b)
checkDist = (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a. (Any -> a -> IO (Any, a)) -> Check a
Check ((Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
 -> Check (ConfigFlags, b))
-> (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a b. (a -> b) -> a -> b
$ \Any
_ (ConfigFlags
configFlags, b
configExFlags) -> do
        -- Always set the chosen @--build-dir@ before saving the flags,
        -- or bad things could happen.
        savedDist <- SavedConfig -> Flag String -> IO String
findSavedDistPref SavedConfig
config (ConfigFlags -> Flag String
configDistPref ConfigFlags
configFlags)
        let distChanged :: Bool
            distChanged = String
dist String -> String -> Bool
forall a. Eq a => a -> a -> Bool
/= String
savedDist
        when distChanged $ info verbosity "build directory changed"
        let configFlags' :: ConfigFlags
            configFlags' = ConfigFlags
configFlags{configDistPref = toFlag dist}
        return (Any distChanged, (configFlags', configExFlags))

      checkOutdated :: Check (ConfigFlags, b)
      checkOutdated :: forall b. Check (ConfigFlags, b)
checkOutdated = (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a. (Any -> a -> IO (Any, a)) -> Check a
Check ((Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
 -> Check (ConfigFlags, b))
-> (Any -> (ConfigFlags, b) -> IO (Any, (ConfigFlags, b)))
-> Check (ConfigFlags, b)
forall a b. (a -> b) -> a -> b
$ \Any
_ flags :: (ConfigFlags, b)
flags@(ConfigFlags
configFlags, b
_) -> do
        let buildConfig :: FilePath
            buildConfig :: String
buildConfig = String -> String
localBuildInfoFile String
dist

        -- Has the package ever been configured? If not, reconfiguration is
        -- required.
        configured <- String -> IO Bool
doesFileExist String
buildConfig
        unless configured $ info verbosity "package has never been configured"

        -- Is the @cabal.config@ file newer than @dist/setup.config@? Then we need
        -- to force reconfigure. Note that it's possible to use @cabal.config@
        -- even without sandboxes.
        userPackageEnvironmentFileModified <-
          existsAndIsMoreRecentThan userPackageEnvironmentFile buildConfig
        when userPackageEnvironmentFileModified $
          info
            verbosity
            ( "user package environment file ('"
                ++ userPackageEnvironmentFile
                ++ "') was modified"
            )

        -- Is the configuration older than the package description?
        descrFile <-
          maybe
            (defaultPackageDesc verbosity)
            return
            (flagToMaybe (configCabalFilePath configFlags))
        outdated <- existsAndIsMoreRecentThan descrFile buildConfig
        when outdated $ info verbosity (descrFile ++ " was changed")

        let failed :: Any
            failed =
              Bool -> Any
Any Bool
outdated
                Any -> Any -> Any
forall a. Semigroup a => a -> a -> a
<> Bool -> Any
Any Bool
userPackageEnvironmentFileModified
                Any -> Any -> Any
forall a. Semigroup a => a -> a -> a
<> Bool -> Any
Any (Bool -> Bool
not Bool
configured)
        return (failed, flags)