2011-03-28 01:43:25 +00:00
|
|
|
{- Git configuration
|
|
|
|
-
|
2019-01-29 17:42:32 +00:00
|
|
|
- Copyright 2011-2019 Joey Hess <id@joeyh.name>
|
2011-03-28 01:43:25 +00:00
|
|
|
-
|
2019-03-13 19:48:14 +00:00
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
2011-03-28 01:43:25 +00:00
|
|
|
-}
|
|
|
|
|
2015-08-17 15:21:13 +00:00
|
|
|
{-# LANGUAGE TypeSynonymInstances, FlexibleInstances #-}
|
|
|
|
|
2011-03-28 01:43:25 +00:00
|
|
|
module Config where
|
|
|
|
|
2016-01-20 20:36:33 +00:00
|
|
|
import Annex.Common
|
2011-06-30 17:16:57 +00:00
|
|
|
import qualified Git
|
2011-12-13 19:05:07 +00:00
|
|
|
import qualified Git.Config
|
2011-12-14 19:56:11 +00:00
|
|
|
import qualified Git.Command
|
2011-03-28 01:43:25 +00:00
|
|
|
import qualified Annex
|
2013-03-13 20:16:01 +00:00
|
|
|
import Config.Cost
|
2017-08-17 18:04:29 +00:00
|
|
|
import Config.DynamicConfig
|
2014-01-13 18:41:10 +00:00
|
|
|
import Types.Availability
|
2015-08-17 15:21:13 +00:00
|
|
|
import Git.Types
|
2017-09-19 17:05:43 +00:00
|
|
|
import qualified Types.Remote as Remote
|
2019-10-10 16:48:26 +00:00
|
|
|
import qualified Annex.SpecialRemote.Config as SpecialRemote
|
2011-03-28 01:43:25 +00:00
|
|
|
|
2019-01-29 17:42:32 +00:00
|
|
|
import qualified Data.Map as M
|
|
|
|
|
2012-05-06 00:15:32 +00:00
|
|
|
type UnqualifiedConfigKey = String
|
|
|
|
data ConfigKey = ConfigKey String
|
2011-03-28 01:43:25 +00:00
|
|
|
|
2013-08-22 16:01:53 +00:00
|
|
|
instance Show ConfigKey where
|
|
|
|
show (ConfigKey s) = s
|
|
|
|
|
2017-02-03 17:40:14 +00:00
|
|
|
{- Looks up a setting in git config. This is not as efficient as using the
|
|
|
|
- GitConfig type. -}
|
2013-01-01 17:52:47 +00:00
|
|
|
getConfig :: ConfigKey -> String -> Annex String
|
2015-01-28 20:11:28 +00:00
|
|
|
getConfig (ConfigKey key) d = fromRepo $ Git.Config.get key d
|
2013-01-01 17:52:47 +00:00
|
|
|
|
2013-09-08 19:19:14 +00:00
|
|
|
getConfigMaybe :: ConfigKey -> Annex (Maybe String)
|
|
|
|
getConfigMaybe (ConfigKey key) = fromRepo $ Git.Config.getMaybe key
|
|
|
|
|
2011-03-28 01:43:25 +00:00
|
|
|
{- Changes a git config setting in both internal state and .git/config -}
|
|
|
|
setConfig :: ConfigKey -> String -> Annex ()
|
2012-05-06 00:15:32 +00:00
|
|
|
setConfig (ConfigKey key) value = do
|
2013-03-03 17:39:07 +00:00
|
|
|
inRepo $ Git.Command.run [Param "config", Param key, Param value]
|
2014-04-08 17:41:36 +00:00
|
|
|
reloadConfig
|
|
|
|
|
|
|
|
reloadConfig :: Annex ()
|
|
|
|
reloadConfig = Annex.changeGitRepo =<< inRepo Git.Config.reRead
|
2011-03-28 01:43:25 +00:00
|
|
|
|
2015-03-02 20:43:44 +00:00
|
|
|
{- Unsets a git config setting. (Leaves it in state.) -}
|
2012-05-06 00:15:32 +00:00
|
|
|
unsetConfig :: ConfigKey -> Annex ()
|
2015-03-02 20:43:44 +00:00
|
|
|
unsetConfig (ConfigKey key) = void $ inRepo $ Git.Config.unset key
|
2012-05-06 00:15:32 +00:00
|
|
|
|
2015-08-17 15:21:13 +00:00
|
|
|
class RemoteNameable r where
|
|
|
|
getRemoteName :: r -> RemoteName
|
|
|
|
|
|
|
|
instance RemoteNameable Git.Repo where
|
|
|
|
getRemoteName r = fromMaybe "" (Git.remoteName r)
|
|
|
|
|
|
|
|
instance RemoteNameable RemoteName where
|
|
|
|
getRemoteName = id
|
|
|
|
|
2017-09-19 17:05:43 +00:00
|
|
|
instance RemoteNameable Remote where
|
|
|
|
getRemoteName = Remote.name
|
|
|
|
|
2019-01-29 17:42:32 +00:00
|
|
|
instance RemoteNameable Remote.RemoteConfig where
|
2019-10-10 16:48:26 +00:00
|
|
|
getRemoteName c = fromMaybe "" (SpecialRemote.lookupName c)
|
2019-01-29 17:42:32 +00:00
|
|
|
|
2012-01-10 03:31:44 +00:00
|
|
|
{- A per-remote config setting in git config. -}
|
2015-08-17 15:21:13 +00:00
|
|
|
remoteConfig :: RemoteNameable r => r -> UnqualifiedConfigKey -> ConfigKey
|
2012-05-06 00:15:32 +00:00
|
|
|
remoteConfig r key = ConfigKey $
|
2015-08-17 15:21:13 +00:00
|
|
|
"remote." ++ getRemoteName r ++ ".annex-" ++ key
|
2012-05-06 00:15:32 +00:00
|
|
|
|
|
|
|
{- A global annex setting in git config. -}
|
|
|
|
annexConfig :: UnqualifiedConfigKey -> ConfigKey
|
|
|
|
annexConfig key = ConfigKey $ "annex." ++ key
|
2011-03-28 01:43:25 +00:00
|
|
|
|
2013-01-01 17:52:47 +00:00
|
|
|
{- Calculates cost for a remote. Either the specific default, or as configured
|
2011-08-18 16:26:28 +00:00
|
|
|
- by remote.<name>.annex-cost, or if remote.<name>.annex-cost-command
|
2011-11-19 19:57:08 +00:00
|
|
|
- is set and prints a number, that is used. -}
|
2013-03-13 20:16:01 +00:00
|
|
|
remoteCost :: RemoteGitConfig -> Cost -> Annex Cost
|
2015-01-28 20:11:28 +00:00
|
|
|
remoteCost c d = fromMaybe d <$> remoteCost' c
|
external special remotes mostly implemented (untested)
This has not been tested at all. It compiles!
The only known missing things are support for encryption, and for get/set
of special remote configuration, and of key state. (The latter needs
separate work to add a new per-key log file to store that state.)
Only thing I don't much like is that initremote needs to be passed both
type=external and externaltype=foo. It would be better to have just
type=foo
Most of this is quite straightforward code, that largely wrote itself given
the types. The only tricky parts were:
* Need to lock the remote when using it to eg make a request, because
in theory git-annex could have multiple threads that each try to use
a remote at the same time. I don't think that git-annex ever does
that currently, but better safe than sorry.
* Rather than starting up every external special remote program when
git-annex starts, they are started only on demand, when first used.
This will avoid slowdown, especially when running fast git-annex query
commands. Once started, they keep running until git-annex stops, currently,
which may not be ideal, but it's hard to know a better time to stop them.
* Bit of a chicken and egg problem with caching the cost of the remote,
because setting annex-cost in the git config needs the remote to already
be set up. Managed to finesse that.
This commit was sponsored by Lukas Anzinger.
2013-12-26 22:23:13 +00:00
|
|
|
|
|
|
|
remoteCost' :: RemoteGitConfig -> Annex (Maybe Cost)
|
2017-08-17 18:04:29 +00:00
|
|
|
remoteCost' = liftIO . getDynamicConfig . remoteAnnexCost
|
2011-03-30 19:15:46 +00:00
|
|
|
|
external special remotes mostly implemented (untested)
This has not been tested at all. It compiles!
The only known missing things are support for encryption, and for get/set
of special remote configuration, and of key state. (The latter needs
separate work to add a new per-key log file to store that state.)
Only thing I don't much like is that initremote needs to be passed both
type=external and externaltype=foo. It would be better to have just
type=foo
Most of this is quite straightforward code, that largely wrote itself given
the types. The only tricky parts were:
* Need to lock the remote when using it to eg make a request, because
in theory git-annex could have multiple threads that each try to use
a remote at the same time. I don't think that git-annex ever does
that currently, but better safe than sorry.
* Rather than starting up every external special remote program when
git-annex starts, they are started only on demand, when first used.
This will avoid slowdown, especially when running fast git-annex query
commands. Once started, they keep running until git-annex stops, currently,
which may not be ideal, but it's hard to know a better time to stop them.
* Bit of a chicken and egg problem with caching the cost of the remote,
because setting annex-cost in the git config needs the remote to already
be set up. Managed to finesse that.
This commit was sponsored by Lukas Anzinger.
2013-12-26 22:23:13 +00:00
|
|
|
setRemoteCost :: Git.Repo -> Cost -> Annex ()
|
|
|
|
setRemoteCost r c = setConfig (remoteConfig r "cost") (show c)
|
2013-03-13 18:10:29 +00:00
|
|
|
|
2014-01-13 18:41:10 +00:00
|
|
|
setRemoteAvailability :: Git.Repo -> Availability -> Annex ()
|
|
|
|
setRemoteAvailability r c = setConfig (remoteConfig r "availability") (show c)
|
|
|
|
|
2016-05-24 19:48:22 +00:00
|
|
|
setRemoteIgnore :: Git.Repo -> Bool -> Annex ()
|
|
|
|
setRemoteIgnore r b = setConfig (remoteConfig r "ignore") (Git.Config.boolConfig b)
|
|
|
|
|
|
|
|
setRemoteBare :: Git.Repo -> Bool -> Annex ()
|
|
|
|
setRemoteBare r b = setConfig (remoteConfig r "bare") (Git.Config.boolConfig b)
|
|
|
|
|
2019-03-08 16:33:44 +00:00
|
|
|
exportTree :: Remote.RemoteConfig -> Bool
|
|
|
|
exportTree c = fromMaybe False $ yesNo =<< M.lookup "exporttree" c
|
|
|
|
|
|
|
|
importTree :: Remote.RemoteConfig -> Bool
|
|
|
|
importTree c = fromMaybe False $ yesNo =<< M.lookup "importtree" c
|
|
|
|
|
2016-06-02 20:59:15 +00:00
|
|
|
isBareRepo :: Annex Bool
|
|
|
|
isBareRepo = fromRepo Git.repoIsLocalBare
|
|
|
|
|
2012-12-07 18:40:31 +00:00
|
|
|
isDirect :: Annex Bool
|
2013-01-01 17:52:47 +00:00
|
|
|
isDirect = annexDirect <$> Annex.getGitConfig
|
2012-12-07 17:17:13 +00:00
|
|
|
|
2013-02-14 18:10:36 +00:00
|
|
|
crippledFileSystem :: Annex Bool
|
|
|
|
crippledFileSystem = annexCrippledFileSystem <$> Annex.getGitConfig
|
|
|
|
|
|
|
|
setCrippledFileSystem :: Bool -> Annex ()
|
|
|
|
setCrippledFileSystem b = do
|
|
|
|
setConfig (annexConfig "crippledfilesystem") (Git.Config.boolConfig b)
|
|
|
|
Annex.changeGitConfig $ \c -> c { annexCrippledFileSystem = b }
|
2018-10-10 15:07:49 +00:00
|
|
|
|
|
|
|
yesNo :: String -> Maybe Bool
|
|
|
|
yesNo "yes" = Just True
|
|
|
|
yesNo "no" = Just False
|
|
|
|
yesNo _ = Nothing
|