2012-11-20 20:43:58 +00:00
|
|
|
{- Amazon Glacier remotes.
|
|
|
|
-
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2012-11-29 18:49:20 +00:00
|
|
|
module Remote.Glacier (remote, jobList) where
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
import qualified Data.Map as M
|
2012-12-01 18:11:37 +00:00
|
|
|
import qualified Data.Text as T
|
2014-08-02 20:47:21 +00:00
|
|
|
import qualified Data.ByteString.Lazy as L
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
import Common.Annex
|
|
|
|
import Types.Remote
|
|
|
|
import Types.Key
|
|
|
|
import qualified Git
|
|
|
|
import Config
|
2013-03-13 20:16:01 +00:00
|
|
|
import Config.Cost
|
2012-11-20 20:43:58 +00:00
|
|
|
import Remote.Helper.Special
|
|
|
|
import qualified Remote.Helper.AWS as AWS
|
|
|
|
import Creds
|
2013-03-28 21:03:04 +00:00
|
|
|
import Utility.Metered
|
2012-11-20 20:43:58 +00:00
|
|
|
import qualified Annex
|
2013-09-07 22:38:00 +00:00
|
|
|
import Annex.UUID
|
2014-01-14 20:42:10 +00:00
|
|
|
import Utility.Env
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
type Vault = String
|
|
|
|
type Archive = FilePath
|
|
|
|
|
|
|
|
remote :: RemoteType
|
|
|
|
remote = RemoteType {
|
|
|
|
typename = "glacier",
|
|
|
|
enumerate = findSpecialRemotes "glacier",
|
|
|
|
generate = gen,
|
|
|
|
setup = glacierSetup
|
|
|
|
}
|
|
|
|
|
2013-09-12 19:54:35 +00:00
|
|
|
gen :: Git.Repo -> UUID -> RemoteConfig -> RemoteGitConfig -> Annex (Maybe Remote)
|
2013-01-01 17:52:47 +00:00
|
|
|
gen r u c gc = new <$> remoteCost gc veryExpensiveRemoteCost
|
2012-11-30 04:55:59 +00:00
|
|
|
where
|
2014-08-03 19:35:23 +00:00
|
|
|
new cst = Just $ specialRemote' specialcfg c
|
2014-08-02 20:47:21 +00:00
|
|
|
(prepareStore this)
|
|
|
|
(prepareRetrieve this)
|
2012-11-20 20:43:58 +00:00
|
|
|
this
|
2012-11-30 04:55:59 +00:00
|
|
|
where
|
|
|
|
this = Remote {
|
|
|
|
uuid = u,
|
|
|
|
cost = cst,
|
|
|
|
name = Git.repoDescribe r,
|
2014-08-02 20:47:21 +00:00
|
|
|
storeKey = storeKeyDummy,
|
|
|
|
retrieveKeyFile = retreiveKeyFileDummy,
|
2012-11-30 04:55:59 +00:00
|
|
|
retrieveKeyFileCheap = retrieveCheap this,
|
|
|
|
removeKey = remove this,
|
2014-08-06 17:45:19 +00:00
|
|
|
checkPresent = checkKey this,
|
|
|
|
checkPresentCheap = False,
|
2012-11-30 04:55:59 +00:00
|
|
|
whereisKey = Nothing,
|
2013-10-11 20:03:18 +00:00
|
|
|
remoteFsck = Nothing,
|
2013-10-27 19:38:59 +00:00
|
|
|
repairRepo = Nothing,
|
2012-11-30 04:55:59 +00:00
|
|
|
config = c,
|
|
|
|
repo = r,
|
2013-01-01 17:52:47 +00:00
|
|
|
gitconfig = gc,
|
2012-11-30 04:55:59 +00:00
|
|
|
localpath = Nothing,
|
|
|
|
readonly = False,
|
2014-01-13 18:41:10 +00:00
|
|
|
availability = GloballyAvailable,
|
2012-11-30 04:55:59 +00:00
|
|
|
remotetype = remote
|
|
|
|
}
|
2014-08-03 19:35:23 +00:00
|
|
|
specialcfg = (specialRemoteCfg c)
|
|
|
|
-- Disabled until jobList gets support for chunks.
|
|
|
|
{ chunkConfig = NoChunks
|
|
|
|
}
|
2012-11-20 20:43:58 +00:00
|
|
|
|
2014-02-11 18:06:50 +00:00
|
|
|
glacierSetup :: Maybe UUID -> Maybe CredPair -> RemoteConfig -> Annex (RemoteConfig, UUID)
|
|
|
|
glacierSetup mu mcreds c = do
|
2013-09-07 22:38:00 +00:00
|
|
|
u <- maybe (liftIO genUUID) return mu
|
2014-02-24 19:14:44 +00:00
|
|
|
c' <- setRemoteCredPair c (AWS.creds u) mcreds
|
|
|
|
glacierSetup' (isJust mu) u c'
|
|
|
|
glacierSetup' :: Bool -> UUID -> RemoteConfig -> Annex (RemoteConfig, UUID)
|
|
|
|
glacierSetup' enabling u c = do
|
2012-11-20 20:43:58 +00:00
|
|
|
c' <- encryptionSetup c
|
|
|
|
let fullconfig = c' `M.union` defaults
|
2014-02-20 19:56:26 +00:00
|
|
|
unless enabling $
|
|
|
|
genVault fullconfig u
|
2012-11-20 20:43:58 +00:00
|
|
|
gitConfigSpecialRemote u fullconfig "glacier" "true"
|
2014-03-27 18:30:36 +00:00
|
|
|
return (fullconfig, u)
|
2012-11-20 20:43:58 +00:00
|
|
|
where
|
|
|
|
remotename = fromJust (M.lookup "name" c)
|
|
|
|
defvault = remotename ++ "-" ++ fromUUID u
|
|
|
|
defaults = M.fromList
|
2012-12-01 18:11:37 +00:00
|
|
|
[ ("datacenter", T.unpack $ AWS.defaultRegion AWS.Glacier)
|
2012-11-20 20:43:58 +00:00
|
|
|
, ("vault", defvault)
|
|
|
|
]
|
|
|
|
|
2014-08-02 20:47:21 +00:00
|
|
|
prepareStore :: Remote -> Preparer Storer
|
|
|
|
prepareStore r = checkPrepare nonEmpty (byteStorer $ store r)
|
|
|
|
|
|
|
|
nonEmpty :: Key -> Annex Bool
|
|
|
|
nonEmpty k
|
2012-11-20 20:43:58 +00:00
|
|
|
| keySize k == Just 0 = do
|
|
|
|
warning "Cannot store empty files in Glacier."
|
|
|
|
return False
|
2014-08-02 20:47:21 +00:00
|
|
|
| otherwise = return True
|
2012-11-25 17:42:28 +00:00
|
|
|
|
2014-08-02 20:47:21 +00:00
|
|
|
store :: Remote -> Key -> L.ByteString -> MeterUpdate -> Annex Bool
|
|
|
|
store r k b p = go =<< glacierEnv c u
|
2012-11-25 17:27:20 +00:00
|
|
|
where
|
2012-11-30 04:55:59 +00:00
|
|
|
c = config r
|
2012-11-25 17:27:20 +00:00
|
|
|
u = uuid r
|
|
|
|
params = glacierParams c
|
2012-11-20 20:43:58 +00:00
|
|
|
[ Param "archive"
|
|
|
|
, Param "upload"
|
|
|
|
, Param "--name", Param $ archive r k
|
2012-11-30 04:55:59 +00:00
|
|
|
, Param $ getVault $ config r
|
2012-11-25 17:27:20 +00:00
|
|
|
, Param "-"
|
2012-11-20 20:43:58 +00:00
|
|
|
]
|
2012-11-25 17:27:20 +00:00
|
|
|
go Nothing = return False
|
|
|
|
go (Just e) = do
|
2014-08-02 20:47:21 +00:00
|
|
|
let cmd = (proc "glacier" (toCommand params)) { env = Just e }
|
2012-11-25 17:27:20 +00:00
|
|
|
liftIO $ catchBoolIO $
|
2014-08-02 20:47:21 +00:00
|
|
|
withHandle StdinHandle createProcessSuccess cmd $ \h -> do
|
|
|
|
meteredWrite p h b
|
2012-11-25 17:27:20 +00:00
|
|
|
return True
|
2012-11-20 20:43:58 +00:00
|
|
|
|
2014-08-02 20:47:21 +00:00
|
|
|
prepareRetrieve :: Remote -> Preparer Retriever
|
2014-08-03 05:12:24 +00:00
|
|
|
prepareRetrieve = simplyPrepare . byteRetriever . retrieve
|
2014-08-02 20:47:21 +00:00
|
|
|
|
2014-08-03 05:12:24 +00:00
|
|
|
retrieve :: Remote -> Key -> (L.ByteString -> Annex Bool) -> Annex Bool
|
|
|
|
retrieve r k sink = go =<< glacierEnv c u
|
2012-11-25 17:42:28 +00:00
|
|
|
where
|
2012-11-30 04:55:59 +00:00
|
|
|
c = config r
|
2012-11-25 17:42:28 +00:00
|
|
|
u = uuid r
|
|
|
|
params = glacierParams c
|
2012-11-20 20:43:58 +00:00
|
|
|
[ Param "archive"
|
|
|
|
, Param "retrieve"
|
2012-11-25 17:42:28 +00:00
|
|
|
, Param "-o-"
|
2012-11-30 04:55:59 +00:00
|
|
|
, Param $ getVault $ config r
|
2012-11-20 20:43:58 +00:00
|
|
|
, Param $ archive r k
|
|
|
|
]
|
2014-08-02 20:47:21 +00:00
|
|
|
go Nothing = error "cannot retrieve from glacier"
|
2012-11-25 17:42:28 +00:00
|
|
|
go (Just e) = do
|
2014-08-02 20:47:21 +00:00
|
|
|
let cmd = (proc "glacier" (toCommand params)) { env = Just e }
|
2014-08-03 05:12:24 +00:00
|
|
|
(_, Just h, _, pid) <- liftIO $ createProcess cmd
|
|
|
|
-- Glacier cannot store empty files, so if the output is
|
|
|
|
-- empty, the content is not available yet.
|
|
|
|
ok <- ifM (liftIO $ hIsEOF h)
|
|
|
|
( return False
|
|
|
|
, sink =<< liftIO (L.hGetContents h)
|
|
|
|
)
|
|
|
|
liftIO $ hClose h
|
|
|
|
liftIO $ forceSuccessProcess cmd pid
|
2014-08-02 20:47:21 +00:00
|
|
|
unless ok $ do
|
|
|
|
showLongNote "Recommend you wait up to 4 hours, and then run this command again."
|
2014-08-03 05:12:24 +00:00
|
|
|
return ok
|
|
|
|
|
|
|
|
retrieveCheap :: Remote -> Key -> FilePath -> Annex Bool
|
|
|
|
retrieveCheap _ _ _ = return False
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
remove :: Remote -> Key -> Annex Bool
|
|
|
|
remove r k = glacierAction r
|
|
|
|
[ Param "archive"
|
2014-08-02 20:47:21 +00:00
|
|
|
|
2012-11-20 20:43:58 +00:00
|
|
|
, Param "delete"
|
2012-11-30 04:55:59 +00:00
|
|
|
, Param $ getVault $ config r
|
2012-11-20 20:43:58 +00:00
|
|
|
, Param $ archive r k
|
|
|
|
]
|
|
|
|
|
2014-08-06 17:45:19 +00:00
|
|
|
checkKey :: Remote -> Key -> Annex Bool
|
|
|
|
checkKey r k = do
|
2012-11-20 20:43:58 +00:00
|
|
|
showAction $ "checking " ++ name r
|
2012-11-30 04:55:59 +00:00
|
|
|
go =<< glacierEnv (config r) (uuid r)
|
2012-11-20 20:43:58 +00:00
|
|
|
where
|
2014-08-06 17:45:19 +00:00
|
|
|
go Nothing = error "cannot check glacier"
|
2012-11-25 17:27:20 +00:00
|
|
|
go (Just e) = do
|
2012-11-20 20:43:58 +00:00
|
|
|
{- glacier checkpresent outputs the archive name to stdout if
|
|
|
|
- it's present. -}
|
2014-08-06 17:45:19 +00:00
|
|
|
s <- liftIO $ readProcessEnv "glacier" (toCommand params) (Just e)
|
|
|
|
let probablypresent = key2file k `elem` lines s
|
|
|
|
if probablypresent
|
|
|
|
then ifM (Annex.getFlag "trustglacier")
|
|
|
|
( return True, error untrusted )
|
|
|
|
else return False
|
2012-11-20 20:43:58 +00:00
|
|
|
|
2014-03-05 03:22:24 +00:00
|
|
|
params = glacierParams (config r)
|
2012-11-20 20:43:58 +00:00
|
|
|
[ Param "archive"
|
|
|
|
, Param "checkpresent"
|
2012-11-30 04:55:59 +00:00
|
|
|
, Param $ getVault $ config r
|
2012-11-21 23:35:28 +00:00
|
|
|
, Param "--quiet"
|
2012-11-20 20:43:58 +00:00
|
|
|
, Param $ archive r k
|
|
|
|
]
|
|
|
|
|
2014-08-06 17:45:19 +00:00
|
|
|
untrusted = unlines
|
2012-11-20 20:43:58 +00:00
|
|
|
[ "Glacier's inventory says it has a copy."
|
|
|
|
, "However, the inventory could be out of date, if it was recently removed."
|
|
|
|
, "(Use --trust-glacier if you're sure it's still in Glacier.)"
|
|
|
|
, ""
|
|
|
|
]
|
|
|
|
|
|
|
|
glacierAction :: Remote -> [CommandParam] -> Annex Bool
|
2013-09-26 03:19:01 +00:00
|
|
|
glacierAction r = runGlacier (config r) (uuid r)
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
runGlacier :: RemoteConfig -> UUID -> [CommandParam] -> Annex Bool
|
|
|
|
runGlacier c u params = go =<< glacierEnv c u
|
|
|
|
where
|
|
|
|
go Nothing = return False
|
2012-11-25 17:27:20 +00:00
|
|
|
go (Just e) = liftIO $
|
|
|
|
boolSystemEnv "glacier" (glacierParams c params) (Just e)
|
2012-11-20 20:43:58 +00:00
|
|
|
|
2012-11-25 17:27:20 +00:00
|
|
|
glacierParams :: RemoteConfig -> [CommandParam] -> [CommandParam]
|
|
|
|
glacierParams c params = datacenter:params
|
|
|
|
where
|
2012-11-20 20:43:58 +00:00
|
|
|
datacenter = Param $ "--region=" ++
|
2014-03-27 18:30:36 +00:00
|
|
|
fromMaybe (error "Missing datacenter configuration")
|
|
|
|
(M.lookup "datacenter" c)
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
glacierEnv :: RemoteConfig -> UUID -> Annex (Maybe [(String, String)])
|
2012-11-28 17:31:49 +00:00
|
|
|
glacierEnv c u = go =<< getRemoteCredPairFor "glacier" c creds
|
2012-11-20 20:43:58 +00:00
|
|
|
where
|
|
|
|
go Nothing = return Nothing
|
|
|
|
go (Just (user, pass)) = do
|
2012-11-25 17:27:20 +00:00
|
|
|
e <- liftIO getEnvironment
|
2014-01-14 20:42:10 +00:00
|
|
|
return $ Just $ addEntries [(uk, user), (pk, pass)] e
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
creds = AWS.creds u
|
|
|
|
(uk, pk) = credPairEnvironment creds
|
|
|
|
|
2012-11-29 18:49:20 +00:00
|
|
|
getVault :: RemoteConfig -> Vault
|
2014-03-27 18:30:36 +00:00
|
|
|
getVault = fromMaybe (error "Missing vault configuration")
|
|
|
|
. M.lookup "vault"
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
archive :: Remote -> Key -> Archive
|
|
|
|
archive r k = fileprefix ++ key2file k
|
|
|
|
where
|
2012-11-30 04:55:59 +00:00
|
|
|
fileprefix = M.findWithDefault "" "fileprefix" $ config r
|
2012-11-20 20:43:58 +00:00
|
|
|
|
|
|
|
genVault :: RemoteConfig -> UUID -> Annex ()
|
|
|
|
genVault c u = unlessM (runGlacier c u params) $
|
|
|
|
error "Failed creating glacier vault."
|
|
|
|
where
|
|
|
|
params =
|
|
|
|
[ Param "vault"
|
|
|
|
, Param "create"
|
2012-11-29 18:49:20 +00:00
|
|
|
, Param $ getVault c
|
2012-11-20 20:43:58 +00:00
|
|
|
]
|
2012-11-29 18:49:20 +00:00
|
|
|
|
|
|
|
{- Partitions the input list of keys into ones which have
|
|
|
|
- glacier retieval jobs that have succeeded, or failed.
|
|
|
|
-
|
|
|
|
- A complication is that `glacier job list` will display the encrypted
|
|
|
|
- keys when the remote is encrypted.
|
2014-08-02 20:47:21 +00:00
|
|
|
-
|
|
|
|
- Dealing with encrypted chunked keys would be tricky. However, there
|
|
|
|
- seems to be no benefit to using chunking with glacier, so chunking is
|
|
|
|
- not supported.
|
2012-11-29 18:49:20 +00:00
|
|
|
-}
|
|
|
|
jobList :: Remote -> [Key] -> Annex ([Key], [Key])
|
2012-11-30 04:55:59 +00:00
|
|
|
jobList r keys = go =<< glacierEnv (config r) (uuid r)
|
2012-11-29 18:49:20 +00:00
|
|
|
where
|
|
|
|
params = [ Param "job", Param "list" ]
|
|
|
|
nada = ([], [])
|
2012-11-30 04:55:59 +00:00
|
|
|
myvault = getVault $ config r
|
2012-11-29 18:49:20 +00:00
|
|
|
|
|
|
|
go Nothing = return nada
|
|
|
|
go (Just e) = do
|
|
|
|
v <- liftIO $ catchMaybeIO $
|
|
|
|
readProcessEnv "glacier" (toCommand params) (Just e)
|
|
|
|
maybe (return nada) extract v
|
|
|
|
|
|
|
|
extract s = do
|
|
|
|
let result@(succeeded, failed) =
|
|
|
|
parse nada $ (map words . lines) s
|
|
|
|
if result == nada
|
|
|
|
then return nada
|
|
|
|
else do
|
|
|
|
enckeys <- forM keys $ \k ->
|
2014-07-27 00:21:36 +00:00
|
|
|
maybe k (\(_, enck) -> enck k)
|
|
|
|
<$> cipherKey (config r)
|
2012-11-29 18:49:20 +00:00
|
|
|
let keymap = M.fromList $ zip enckeys keys
|
2013-09-26 03:19:01 +00:00
|
|
|
let convert = mapMaybe (`M.lookup` keymap)
|
2012-11-29 18:49:20 +00:00
|
|
|
return (convert succeeded, convert failed)
|
|
|
|
|
|
|
|
parse c [] = c
|
|
|
|
parse c@(succeeded, failed) ((status:_date:vault:key:[]):rest)
|
|
|
|
| vault == myvault =
|
|
|
|
case file2key key of
|
|
|
|
Nothing -> parse c rest
|
|
|
|
Just k
|
|
|
|
| "a/d" `isPrefixOf` status ->
|
|
|
|
parse (k:succeeded, failed) rest
|
|
|
|
| "a/e" `isPrefixOf` status ->
|
|
|
|
parse (succeeded, k:failed) rest
|
|
|
|
| otherwise ->
|
|
|
|
parse c rest
|
|
|
|
parse c (_:rest) = parse c rest
|