2012-11-29 18:49:20 +00:00
|
|
|
{- git-annex assistant Amazon Glacier retrieval
|
|
|
|
-
|
2015-01-21 16:50:09 +00:00
|
|
|
- Copyright 2012 Joey Hess <id@joeyh.name>
|
2012-11-29 18:49:20 +00:00
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
|
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
|
|
|
|
module Assistant.Threads.Glacier where
|
|
|
|
|
|
|
|
import Assistant.Common
|
|
|
|
import Utility.ThreadScheduler
|
|
|
|
import qualified Types.Remote as Remote
|
|
|
|
import qualified Remote.Glacier as Glacier
|
2016-08-03 16:37:12 +00:00
|
|
|
import Types.Transfer
|
2012-11-29 18:49:20 +00:00
|
|
|
import Logs.Transfer
|
|
|
|
import Assistant.DaemonStatus
|
|
|
|
import Assistant.TransferQueue
|
|
|
|
|
|
|
|
import qualified Data.Set as S
|
|
|
|
|
|
|
|
{- Wakes up every half hour and checks if any glacier remotes have failed
|
|
|
|
- downloads. If so, runs glacier-cli to check if the files are now
|
|
|
|
- available, and queues the downloads. -}
|
|
|
|
glacierThread :: NamedThread
|
2013-01-26 06:09:33 +00:00
|
|
|
glacierThread = namedThread "Glacier" $ runEvery (Seconds 3600) <~> go
|
2012-11-29 18:49:20 +00:00
|
|
|
where
|
|
|
|
isglacier r = Remote.remotetype r == Glacier.remote
|
|
|
|
go = do
|
2017-09-20 17:27:59 +00:00
|
|
|
rs <- filter isglacier . downloadRemotes <$> getDaemonStatus
|
2012-11-29 18:49:20 +00:00
|
|
|
forM_ rs $ \r ->
|
2013-10-03 02:59:07 +00:00
|
|
|
check r =<< liftAnnex (getFailedTransfers $ Remote.uuid r)
|
2012-11-29 18:49:20 +00:00
|
|
|
check _ [] = noop
|
|
|
|
check r l = do
|
|
|
|
let keys = map getkey l
|
|
|
|
(availkeys, failedkeys) <- liftAnnex $ Glacier.jobList r keys
|
|
|
|
let s = S.fromList (failedkeys ++ availkeys)
|
|
|
|
let l' = filter (\p -> S.member (getkey p) s) l
|
|
|
|
forM_ l' $ \(t, info) -> do
|
|
|
|
liftAnnex $ removeFailedTransfer t
|
2013-03-01 19:23:59 +00:00
|
|
|
queueTransferWhenSmall "object available from glacier" (associatedFile info) t r
|
2012-11-29 18:49:20 +00:00
|
|
|
getkey = transferKey . fst
|