remove 163 lines of code without changing anything except imports
This commit is contained in:
parent
8dd5d180f1
commit
737e45156e
259 changed files with 192 additions and 355 deletions
|
@ -14,7 +14,7 @@ import qualified Data.Map as M
|
|||
import System.Posix.Signals
|
||||
#endif
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Annex.Content
|
||||
|
||||
|
|
|
@ -11,7 +11,7 @@ module Annex.AutoMerge
|
|||
, commitResolvedMerge
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex.Queue
|
||||
import Annex.Direct
|
||||
import Annex.CatFile
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.BloomFilter where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Utility.Bloom
|
||||
|
||||
|
|
|
@ -32,7 +32,7 @@ import qualified Data.Map as M
|
|||
import Data.Bits.Utils
|
||||
import Control.Concurrent (threadDelay)
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.BranchState
|
||||
import Annex.Journal
|
||||
import Annex.Index
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.BranchState where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.BranchState
|
||||
import qualified Annex
|
||||
|
||||
|
|
|
@ -23,7 +23,7 @@ import qualified Data.ByteString.Lazy as L
|
|||
import qualified Data.Map as M
|
||||
import System.PosixCompat.Types
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git
|
||||
import qualified Git.CatFile
|
||||
import qualified Annex
|
||||
|
|
|
@ -11,7 +11,7 @@ module Annex.CheckAttr (
|
|||
checkAttrStop,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git.CheckAttr as Git
|
||||
import qualified Annex
|
||||
|
||||
|
|
|
@ -12,7 +12,7 @@ module Annex.CheckIgnore (
|
|||
checkIgnoreStop
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git.CheckIgnore as Git
|
||||
import qualified Annex
|
||||
|
||||
|
|
|
@ -1,8 +1,9 @@
|
|||
module Common.Annex (module X) where
|
||||
module Annex.Common (module X) where
|
||||
|
||||
import Common as X
|
||||
import Types as X
|
||||
import Types.UUID as X (toUUID, fromUUID)
|
||||
import Types.Key as X
|
||||
import Types.UUID as X
|
||||
import Annex as X (gitRepo, inRepo, fromRepo, calcRepo)
|
||||
import Locations as X
|
||||
import Annex.Locations as X
|
||||
import Messages as X
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.Concurrent where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex
|
||||
import Annex.CatFile
|
||||
import Annex.CheckAttr
|
||||
|
|
|
@ -52,7 +52,7 @@ module Annex.Content (
|
|||
import System.IO.Unsafe (unsafeInterleaveIO)
|
||||
import qualified Data.Set as S
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.Location
|
||||
import Logs.Transfer
|
||||
import qualified Git
|
||||
|
@ -62,7 +62,6 @@ import qualified Annex.Branch
|
|||
import Utility.DiskFree
|
||||
import Utility.FileMode
|
||||
import qualified Annex.Url as Url
|
||||
import Types.Key
|
||||
import Utility.DataUnits
|
||||
import Utility.CopyFile
|
||||
import Utility.Metered
|
||||
|
@ -336,12 +335,12 @@ verifyKeyContent v Types.Remote.UnVerified k f = ifM (shouldVerify v)
|
|||
, return True
|
||||
)
|
||||
where
|
||||
verifysize = case Types.Key.keySize k of
|
||||
verifysize = case keySize k of
|
||||
Nothing -> return True
|
||||
Just size -> do
|
||||
size' <- liftIO $ catchDefaultIO 0 $ getFileSize f
|
||||
return (size' == size)
|
||||
verifycontent = case Types.Backend.verifyKeyContent =<< Backend.maybeLookupBackendName (Types.Key.keyBackendName k) of
|
||||
verifycontent = case Types.Backend.verifyKeyContent =<< Backend.maybeLookupBackendName (keyBackendName k) of
|
||||
Nothing -> return True
|
||||
Just verifier -> verifier k f
|
||||
|
||||
|
|
|
@ -29,7 +29,7 @@ module Annex.Content.Direct (
|
|||
addContentWhenNotPresent,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.Perms
|
||||
import qualified Git
|
||||
import Utility.Tmp
|
||||
|
|
|
@ -10,7 +10,7 @@ module Annex.Difference (
|
|||
setDifferences,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Difference
|
||||
import Logs.Difference
|
||||
import Config
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
|
||||
module Annex.Direct where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import qualified Git
|
||||
import qualified Git.LsFiles
|
||||
|
|
|
@ -7,11 +7,10 @@
|
|||
|
||||
module Annex.Drop where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.Trust
|
||||
import Annex.NumCopies
|
||||
import Types.Remote (uuid)
|
||||
import Types.Key (key2file)
|
||||
import qualified Remote
|
||||
import qualified Command.Drop
|
||||
import Command
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.Environment where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Utility.UserInfo
|
||||
import qualified Git.Config
|
||||
import Config
|
||||
|
|
|
@ -9,7 +9,7 @@ module Annex.FileMatcher where
|
|||
|
||||
import qualified Data.Map as M
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Limit
|
||||
import Utility.Matcher
|
||||
import Types.Group
|
||||
|
|
|
@ -11,7 +11,7 @@
|
|||
|
||||
module Annex.Hook where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git.Hook as Git
|
||||
import Config
|
||||
import qualified Annex
|
||||
|
|
|
@ -14,7 +14,7 @@ module Annex.Index (
|
|||
|
||||
import qualified Control.Exception as E
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Git.Types
|
||||
import qualified Annex
|
||||
import Utility.Env
|
||||
|
|
|
@ -21,7 +21,7 @@ module Annex.Ingest (
|
|||
forceParams,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.KeySource
|
||||
import Backend
|
||||
import Annex.Content
|
||||
|
|
|
@ -16,7 +16,7 @@ module Annex.Init (
|
|||
probeCrippledFileSystem,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import qualified Git
|
||||
import qualified Git.LsFiles
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.InodeSentinal where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Utility.InodeCache
|
||||
import Annex.Perms
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
|
||||
module Annex.Journal where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git
|
||||
import Annex.Perms
|
||||
import Annex.LockFile
|
||||
|
|
|
@ -14,14 +14,13 @@
|
|||
|
||||
module Annex.Link where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import qualified Git.HashObject
|
||||
import qualified Git.UpdateIndex
|
||||
import qualified Annex.Queue
|
||||
import Git.Types
|
||||
import Git.FilePath
|
||||
import Types.Key
|
||||
|
||||
import qualified Data.ByteString.Lazy as L
|
||||
|
||||
|
|
|
@ -5,7 +5,7 @@
|
|||
- Licensed under the GNU GPL version 3 or higher.
|
||||
-}
|
||||
|
||||
module Locations (
|
||||
module Annex.Locations (
|
||||
keyFile,
|
||||
fileKey,
|
||||
keyPaths,
|
||||
|
@ -76,9 +76,9 @@ import Data.Char
|
|||
import Data.Default
|
||||
|
||||
import Common
|
||||
import Types.GitConfig
|
||||
import Types.Key
|
||||
import Types.UUID
|
||||
import Types.GitConfig
|
||||
import Types.Difference
|
||||
import qualified Git
|
||||
import Git.FilePath
|
|
@ -15,7 +15,7 @@ module Annex.LockFile (
|
|||
tryExclusiveLock,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex
|
||||
import Types.LockCache
|
||||
import qualified Git
|
||||
|
|
|
@ -20,7 +20,9 @@ module Annex.LockPool.PosixOrPid (
|
|||
checkSaneLock,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Common
|
||||
import Types
|
||||
import Annex.Locations
|
||||
import qualified Annex
|
||||
import qualified Utility.LockPool.Posix as Posix
|
||||
import qualified Utility.LockPool.PidLock as Pid
|
||||
|
@ -58,7 +60,7 @@ checkSaneLock f h = H.checkSaneLock f h
|
|||
|
||||
pidLockFile :: Annex (Maybe FilePath)
|
||||
pidLockFile = ifM (annexPidLock <$> Annex.getGitConfig)
|
||||
( Just <$> fromRepo gitAnnexPidLockFile
|
||||
( Just <$> Annex.fromRepo gitAnnexPidLockFile
|
||||
, pure Nothing
|
||||
)
|
||||
|
||||
|
|
|
@ -11,7 +11,7 @@ module Annex.MetaData (
|
|||
module X
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Types.MetaData as X
|
||||
import Annex.MetaData.StandardFields as X
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.Notification (NotifyWitness, notifyTransfer, notifyDrop) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.Transfer
|
||||
#ifdef WITH_DBUS_NOTIFICATIONS
|
||||
import qualified Annex
|
||||
|
|
|
@ -22,7 +22,7 @@ module Annex.NumCopies (
|
|||
UnVerifiedCopy(..),
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Types.NumCopies
|
||||
import Logs.NumCopies
|
||||
|
|
|
@ -18,7 +18,7 @@ module Annex.Perms (
|
|||
withShared,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Utility.FileMode
|
||||
import Git.SharedRepository
|
||||
import qualified Annex
|
||||
|
|
|
@ -16,7 +16,7 @@ module Annex.Queue (
|
|||
mergeFrom,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex hiding (new)
|
||||
import qualified Git.Queue
|
||||
import qualified Git.UpdateIndex
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.Quvi where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Utility.Quvi
|
||||
import Utility.Url
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.ReplaceFile where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.Perms
|
||||
import Utility.Tmp
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.SpecialRemote where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Remote (remoteTypes, remoteMap)
|
||||
import Types.Remote (RemoteConfig, RemoteConfigKey, typename, setup)
|
||||
import Logs.Remote
|
||||
|
|
|
@ -24,7 +24,7 @@ import qualified Data.Map as M
|
|||
import Data.Hash.MD5
|
||||
import System.Exit
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.LockFile
|
||||
import qualified Build.SysConfig as SysConfig
|
||||
import qualified Annex
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.TaggedPush where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Remote
|
||||
import qualified Annex.Branch
|
||||
import qualified Git
|
||||
|
|
|
@ -18,7 +18,7 @@ module Annex.Transfer (
|
|||
forwardRetry,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.Transfer as X
|
||||
import Annex.Notification as X
|
||||
import Annex.Perms
|
||||
|
|
|
@ -28,7 +28,7 @@ module Annex.UUID (
|
|||
bitTorrentUUID,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git
|
||||
import qualified Git.Config
|
||||
import Config
|
||||
|
|
|
@ -13,7 +13,7 @@ module Annex.Url (
|
|||
getUserAgent,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Utility.Url as U
|
||||
import qualified Build.SysConfig as SysConfig
|
||||
|
|
|
@ -7,8 +7,7 @@
|
|||
|
||||
module Annex.VariantFile where
|
||||
|
||||
import Common.Annex
|
||||
import Types.Key
|
||||
import Annex.Common
|
||||
|
||||
import Data.Hash.MD5
|
||||
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Annex.Version where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Config
|
||||
import qualified Annex
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.View where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.View.ViewedFile
|
||||
import Types.View
|
||||
import Types.MetaData
|
||||
|
|
|
@ -16,7 +16,7 @@ module Annex.View.ViewedFile (
|
|||
prop_viewedFile_roundtrips,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
|
||||
type FileName = String
|
||||
type ViewedFile = FileName
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.Wanted where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.PreferredContent
|
||||
import Annex.UUID
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Annex.WorkTree where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Annex.Link
|
||||
import Annex.CatFile
|
||||
import Annex.Version
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Assistant.Alert where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Types.Alert
|
||||
import Assistant.Alert.Utility
|
||||
import qualified Remote
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Alert.Utility where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Types.Alert
|
||||
import Utility.Tense
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Common (module X) where
|
||||
|
||||
import Common.Annex as X
|
||||
import Annex.Common as X
|
||||
import Assistant.Monad as X
|
||||
import Assistant.Types.DaemonStatus as X
|
||||
import Assistant.Types.NamedThread as X
|
||||
|
|
|
@ -28,7 +28,7 @@ module Assistant.Monad (
|
|||
import "mtl" Control.Monad.Reader
|
||||
import System.Log.Logger
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Types.ThreadedMonad
|
||||
import Assistant.Types.DaemonStatus
|
||||
import Assistant.Types.ScanRemotes
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Assistant.NamedThread where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Types.NamedThread
|
||||
import Assistant.Types.ThreadName
|
||||
import Assistant.Types.DaemonStatus
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Assistant.Pairing where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Utility.Verifiable
|
||||
import Assistant.Ssh
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Ssh where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Utility.Tmp
|
||||
import Utility.Shell
|
||||
import Utility.Rsync
|
||||
|
|
|
@ -40,7 +40,6 @@ import Assistant.Unused
|
|||
import Logs.Unused
|
||||
import Logs.Transfer
|
||||
import Annex.Path
|
||||
import Types.Key (keyBackendName)
|
||||
import qualified Annex
|
||||
#ifdef WITH_WEBAPP
|
||||
import Assistant.WebApp.Types
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module Assistant.Types.Buddies where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
|
||||
import qualified Data.Map as M
|
||||
import Control.Concurrent.STM
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.DaemonStatus where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Pairing
|
||||
import Utility.NotificationBroadcaster
|
||||
import Logs.Transfer
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.NetMessager where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Pairing
|
||||
import Git.Types
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.Pushes where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
|
||||
import Control.Concurrent.STM
|
||||
import Data.Time.Clock
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.ScanRemotes where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
|
||||
import Control.Concurrent.STM
|
||||
import qualified Data.Map as M
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.ThreadedMonad where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
|
||||
import Control.Concurrent
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.TransferQueue where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Logs.Transfer
|
||||
|
||||
import Control.Concurrent.STM
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.Types.TransferrerPool where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Utility.NotificationBroadcaster
|
||||
import Assistant.Types.DaemonStatus
|
||||
|
||||
|
|
|
@ -13,7 +13,6 @@ import qualified Data.Map as M
|
|||
|
||||
import Assistant.Common
|
||||
import qualified Git
|
||||
import Types.Key
|
||||
import Logs.Unused
|
||||
import Logs.Location
|
||||
import Annex.Content
|
||||
|
|
|
@ -19,7 +19,6 @@ import Utility.NotificationBroadcaster
|
|||
import Logs.Transfer
|
||||
import Utility.Percentage
|
||||
import Utility.DataUnits
|
||||
import Types.Key
|
||||
import qualified Remote
|
||||
import qualified Git
|
||||
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module Assistant.WebApp.RepoId where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Git.Types (RemoteName)
|
||||
import qualified Remote
|
||||
|
||||
|
|
|
@ -8,7 +8,7 @@
|
|||
module Assistant.XMPP.Buddies where
|
||||
|
||||
import Assistant.XMPP
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Assistant.Types.Buddies
|
||||
|
||||
import Network.Protocol.XMPP
|
||||
|
|
|
@ -16,10 +16,9 @@ module Backend (
|
|||
isStableKey,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Annex.CheckAttr
|
||||
import Types.Key
|
||||
import Types.KeySource
|
||||
import qualified Types.Backend as B
|
||||
|
||||
|
|
|
@ -12,10 +12,9 @@ module Backend.Hash (
|
|||
testKeyBackend,
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Types.Backend
|
||||
import Types.Key
|
||||
import Types.KeySource
|
||||
import Utility.Hash
|
||||
import Utility.ExternalSHA
|
||||
|
|
|
@ -10,9 +10,8 @@ module Backend.URL (
|
|||
fromUrl
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Backend
|
||||
import Types.Key
|
||||
import Backend.Utilities
|
||||
|
||||
backends :: [Backend]
|
||||
|
|
|
@ -9,7 +9,7 @@ module Backend.Utilities where
|
|||
|
||||
import Data.Hash.MD5
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
|
||||
{- Generates a keyName from an input string. Takes care of sanitizing it.
|
||||
- If it's not too long, the full string is used as the keyName.
|
||||
|
|
|
@ -7,9 +7,8 @@
|
|||
|
||||
module Backend.WORM (backends) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Backend
|
||||
import Types.Key
|
||||
import Types.KeySource
|
||||
import Backend.Utilities
|
||||
import Git.FilePath
|
||||
|
|
|
@ -8,7 +8,7 @@
|
|||
- Also gpg signs the files.
|
||||
-}
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Distribution
|
||||
import Build.Version (getChangelogVersion, Version)
|
||||
import Utility.UserInfo
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
|
||||
module Checks where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Command
|
||||
import Annex.Init
|
||||
import Config
|
||||
|
|
|
@ -15,7 +15,7 @@ import qualified Options.Applicative.Help as H
|
|||
import qualified Control.Exception as E
|
||||
import Control.Exception (throw)
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import qualified Git
|
||||
import qualified Git.AutoCorrect
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
|
||||
module CmdLine.Action where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Annex.Concurrent
|
||||
import Types.Command
|
||||
|
|
|
@ -7,8 +7,11 @@
|
|||
|
||||
module CmdLine.Batch where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Annex.Common
|
||||
import Types.Command
|
||||
import CmdLine.Action
|
||||
import CmdLine.GitAnnex.Options
|
||||
import Options.Applicative
|
||||
|
||||
data BatchMode = Batch | NoBatch
|
||||
|
||||
|
|
|
@ -11,14 +11,13 @@ import Options.Applicative
|
|||
import Options.Applicative.Builder.Internal
|
||||
import Control.Concurrent
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git.Config
|
||||
import qualified Git.Construct
|
||||
import Git.Types
|
||||
import Types.TrustLevel
|
||||
import Types.NumCopies
|
||||
import Types.Messages
|
||||
import Types.Key
|
||||
import Types.Command
|
||||
import Types.DeferredParse
|
||||
import Types.DesktopNotify
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module CmdLine.GitAnnexShell where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Git.Construct
|
||||
import qualified Git.Config
|
||||
import CmdLine
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module CmdLine.GitAnnexShell.Checks where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Command
|
||||
import qualified Annex
|
||||
import Annex.Init
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module CmdLine.GitAnnexShell.Fields where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import qualified Annex
|
||||
import Git.FilePath
|
||||
|
||||
|
|
|
@ -9,7 +9,7 @@ module CmdLine.Option where
|
|||
|
||||
import Options.Applicative
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import CmdLine.Usage
|
||||
import CmdLine.GlobalSetter
|
||||
import qualified Annex
|
||||
|
|
|
@ -11,9 +11,8 @@
|
|||
|
||||
module CmdLine.Seek where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Command
|
||||
import Types.Key
|
||||
import Types.FileMatcher
|
||||
import qualified Annex
|
||||
import qualified Git
|
||||
|
|
|
@ -7,7 +7,7 @@
|
|||
|
||||
module CmdLine.Usage where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common
|
||||
import Types.Command
|
||||
|
||||
usageMessage :: String -> String
|
||||
|
|
|
@ -23,19 +23,19 @@ module Command (
|
|||
module ReExported
|
||||
) where
|
||||
|
||||
import Common.Annex
|
||||
import Annex.Common as ReExported
|
||||
import Annex.WorkTree
|
||||
import qualified Git
|
||||
import Types.Command as ReExported
|
||||
import Types.Option as ReExported
|
||||
import Types.DeferredParse as ReExported
|
||||
import CmdLine.Seek as ReExported
|
||||
import Checks as ReExported
|
||||
import CmdLine.Seek as ReExported
|
||||
import CmdLine.Usage as ReExported
|
||||
import CmdLine.Action as ReExported
|
||||
import CmdLine.Option as ReExported
|
||||
import CmdLine.GlobalSetter as ReExported
|
||||
import CmdLine.GitAnnex.Options as ReExported
|
||||
import CmdLine.Batch as ReExported
|
||||
import Options.Applicative as ReExported hiding (command)
|
||||
|
||||
import qualified Options.Applicative as O
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Add where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Annex.Ingest
|
||||
import Logs.Location
|
||||
|
@ -16,13 +15,11 @@ import Annex.Content.Direct
|
|||
import Annex.Link
|
||||
import qualified Annex
|
||||
import qualified Annex.Queue
|
||||
import qualified Database.Keys
|
||||
import Config
|
||||
import Utility.InodeCache
|
||||
import Annex.FileMatcher
|
||||
import Annex.Version
|
||||
import qualified Database.Keys
|
||||
import Types.Key
|
||||
import CmdLine.Batch
|
||||
|
||||
cmd :: Command
|
||||
cmd = notBareRepo $ withGlobalOptions (jobsOption : jsonOption : fileMatchingOptions) $
|
||||
|
|
|
@ -7,12 +7,10 @@
|
|||
|
||||
module Command.AddUnused where
|
||||
|
||||
import Common.Annex
|
||||
import Logs.Location
|
||||
import Command
|
||||
import Annex.Ingest
|
||||
import Command.Unused (withUnusedMaps, UnusedMaps(..), startUnused)
|
||||
import Types.Key
|
||||
|
||||
cmd :: Command
|
||||
cmd = notDirect $
|
||||
|
|
|
@ -11,7 +11,6 @@ module Command.AddUrl where
|
|||
|
||||
import Network.URI
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Backend
|
||||
import qualified Annex
|
||||
|
@ -25,7 +24,6 @@ import Annex.Content
|
|||
import Annex.Ingest
|
||||
import Annex.UUID
|
||||
import Logs.Web
|
||||
import Types.Key
|
||||
import Types.KeySource
|
||||
import Types.UrlContents
|
||||
import Config
|
||||
|
@ -33,7 +31,6 @@ import Annex.Content.Direct
|
|||
import Annex.FileMatcher
|
||||
import Logs.Location
|
||||
import Utility.Metered
|
||||
import CmdLine.Batch
|
||||
import qualified Annex.Transfer as Transfer
|
||||
#ifdef WITH_QUVI
|
||||
import Annex.Quvi
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Assistant where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Command.Watch
|
||||
import Annex.Init
|
||||
|
|
|
@ -7,9 +7,7 @@
|
|||
|
||||
module Command.CheckPresentKey where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Types.Key
|
||||
import qualified Remote
|
||||
import Annex
|
||||
import Types.Messages
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Commit where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Annex.Branch
|
||||
import qualified Git
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.ConfigList where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Annex.UUID
|
||||
import Annex.Init
|
||||
|
|
|
@ -7,11 +7,8 @@
|
|||
|
||||
module Command.ContentLocation where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import CmdLine.Batch
|
||||
import Annex.Content
|
||||
import Types.Key
|
||||
|
||||
cmd :: Command
|
||||
cmd = noCommit $
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Copy where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Command.Move
|
||||
import qualified Remote
|
||||
|
|
|
@ -8,9 +8,7 @@
|
|||
module Command.Dead where
|
||||
|
||||
import Command
|
||||
import Common.Annex
|
||||
import Types.TrustLevel
|
||||
import Types.Key
|
||||
import Command.Trust (trustCommand)
|
||||
import Logs.Location
|
||||
import Remote (keyLocations)
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Describe where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Remote
|
||||
import Logs.UUID
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.DiffDriver where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import Annex.Content
|
||||
import Annex.Link
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Direct where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Git
|
||||
import qualified Git.LsFiles
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.Drop where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Remote
|
||||
import qualified Annex
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.DropKey where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Annex
|
||||
import Logs.Location
|
||||
|
|
|
@ -7,7 +7,6 @@
|
|||
|
||||
module Command.DropUnused where
|
||||
|
||||
import Common.Annex
|
||||
import Command
|
||||
import qualified Command.Drop
|
||||
import qualified Remote
|
||||
|
|
Some files were not shown because too many files have changed in this diff Show more
Loading…
Reference in a new issue