git-annex/Remote/S3.hs

322 lines
9.4 KiB
Haskell
Raw Normal View History

2011-03-28 02:00:44 +00:00
{- Amazon S3 remotes.
-
- Copyright 2011 Joey Hess <joey@kitenet.net>
-
- Licensed under the GNU GPL version 3 or higher.
-}
2011-03-29 03:51:07 +00:00
module Remote.S3 (remote) where
2011-03-28 02:00:44 +00:00
import Network.AWS.AWSConnection
import Network.AWS.S3Object
import Network.AWS.S3Bucket hiding (size)
import Network.AWS.AWSResult
import qualified Data.ByteString.Lazy.Char8 as L
2011-03-29 17:49:54 +00:00
import qualified Data.Map as M
import Data.Char
import System.Environment
import System.Posix.Env (setEnv)
2011-03-28 02:00:44 +00:00
2011-10-05 20:02:51 +00:00
import Common.Annex
import Types.Remote
import Types.Key
import qualified Git
2011-03-30 19:15:46 +00:00
import Config
2011-08-17 00:49:54 +00:00
import Remote.Helper.Special
import Remote.Helper.Encryptable
import Crypto
2011-10-04 04:40:47 +00:00
import Annex.Content
2011-07-06 00:24:10 +00:00
import Utility.Base64
2011-03-28 02:00:44 +00:00
remote :: RemoteType
remote = RemoteType {
2011-03-29 18:55:59 +00:00
typename = "S3",
2011-03-30 18:00:54 +00:00
enumerate = findSpecialRemotes "s3",
generate = gen,
2011-03-29 18:55:59 +00:00
setup = s3Setup
}
2011-03-29 03:51:07 +00:00
2011-12-31 08:11:39 +00:00
gen :: Git.Repo -> UUID -> Maybe RemoteConfig -> Annex Remote
2011-03-30 19:15:46 +00:00
gen r u c = do
cst <- remoteCost r expensiveRemoteCost
return $ gen' r u c cst
2011-12-31 08:11:39 +00:00
gen' :: Git.Repo -> UUID -> Maybe RemoteConfig -> Int -> Remote
2011-07-15 16:47:14 +00:00
gen' r u c cst =
encryptableRemote c
(storeEncrypted this)
(retrieveEncrypted this)
this
2011-03-29 21:57:20 +00:00
where
this = Remote {
2011-03-29 21:57:20 +00:00
uuid = u,
cost = cst,
name = Git.repoDescribe r,
storeKey = store this,
retrieveKeyFile = retrieve this,
retrieveKeyFileCheap = retrieveCheap this,
removeKey = remove this,
hasKey = checkPresent this,
2011-03-29 21:57:20 +00:00
hasKeyCheap = False,
config = c,
repo = r,
remotetype = remote
2011-03-29 21:57:20 +00:00
}
2011-04-15 19:09:36 +00:00
s3Setup :: UUID -> RemoteConfig -> Annex RemoteConfig
s3Setup u c = handlehost $ M.lookup "host" c
2011-03-29 20:21:21 +00:00
where
2011-03-29 21:20:22 +00:00
remotename = fromJust (M.lookup "name" c)
defbucket = remotename ++ "-" ++ fromUUID u
2011-03-29 20:21:21 +00:00
defaults = M.fromList
[ ("datacenter", "US")
, ("storageclass", "STANDARD")
, ("host", defaultAmazonS3Host)
, ("port", show defaultAmazonS3Port)
, ("bucket", defbucket)
2011-03-29 20:21:21 +00:00
]
handlehost Nothing = defaulthost
handlehost (Just h)
2011-07-15 16:47:14 +00:00
| ".archive.org" `isSuffixOf` map toLower h = archiveorg
| otherwise = defaulthost
use fullconfig = do
gitConfigSpecialRemote u fullconfig "s3" "true"
s3SetCreds fullconfig
defaulthost = do
c' <- encryptionSetup c
2011-09-21 03:24:48 +00:00
let fullconfig = c' `M.union` defaults
genBucket fullconfig
use fullconfig
archiveorg = do
2011-07-15 16:47:14 +00:00
showNote "Internet Archive mode"
maybe (error "specify bucket=") (const $ return ()) $
M.lookup "bucket" archiveconfig
use archiveconfig
where
archiveconfig =
-- hS3 does not pass through
-- x-archive-* headers
M.mapKeys (replace "x-archive-" "x-amz-") $
-- encryption does not make sense here
M.insert "encryption" "none" $
M.union c $
-- special constraints on key names
M.insert "mungekeys" "ia" $
-- bucket created only when files
-- are uploaded
M.insert "x-amz-auto-make-bucket" "1" $
-- no default bucket name; should
-- be human-readable
M.delete "bucket" defaults
2011-03-29 20:21:21 +00:00
2011-12-31 08:11:39 +00:00
store :: Remote -> Key -> Annex Bool
store r k = s3Action r False $ \(conn, bucket) -> do
dest <- inRepo $ gitAnnexLocation k
res <- liftIO $ storeHelper (conn, bucket) r k dest
s3Bool res
2011-12-31 08:11:39 +00:00
storeEncrypted :: Remote -> (Cipher, Key) -> Key -> Annex Bool
storeEncrypted r (cipher, enck) k = s3Action r False $ \(conn, bucket) ->
-- To get file size of the encrypted content, have to use a temp file.
-- (An alternative would be chunking to to a constant size.)
withTmp enck $ \tmp -> do
f <- inRepo $ gitAnnexLocation k
liftIO $ withEncryptedContent cipher (L.readFile f) $ \s -> L.writeFile tmp s
res <- liftIO $ storeHelper (conn, bucket) r enck tmp
s3Bool res
2011-12-31 08:11:39 +00:00
storeHelper :: (AWSConnection, String) -> Remote -> Key -> FilePath -> IO (AWSResult ())
storeHelper (conn, bucket) r k file = do
content <- liftIO $ L.readFile file
-- size is provided to S3 so the whole content does not need to be
-- buffered to calculate it
2011-05-15 06:49:43 +00:00
size <- maybe getsize (return . fromIntegral) $ keySize k
let object = setStorageClass storageclass $
S3Object bucket (bucketFile r k) ""
(("Content-Length", show size) : xheaders) content
sendObject conn object
2011-03-29 20:21:21 +00:00
where
2011-03-29 21:20:22 +00:00
storageclass =
case fromJust $ M.lookup "storageclass" $ fromJust $ config r of
"REDUCED_REDUNDANCY" -> REDUCED_REDUNDANCY
_ -> STANDARD
2011-05-15 06:49:43 +00:00
getsize = do
s <- liftIO $ getFileStatus file
return $ fileSize s
xheaders = filter isxheader $ M.assocs $ fromJust $ config r
isxheader (h, _) = "x-amz-" `isPrefixOf` h
retrieve :: Remote -> Key -> FilePath -> Annex Bool
retrieve r k f = s3Action r False $ \(conn, bucket) -> do
res <- liftIO $ getObject conn $ bucketKey r bucket k
case res of
Right o -> do
liftIO $ L.writeFile f $ obj_data o
return True
Left e -> s3Warning e
retrieveCheap :: Remote -> Key -> FilePath -> Annex Bool
retrieveCheap _ _ _ = return False
2011-12-31 08:11:39 +00:00
retrieveEncrypted :: Remote -> (Cipher, Key) -> FilePath -> Annex Bool
retrieveEncrypted r (cipher, enck) f = s3Action r False $ \(conn, bucket) -> do
res <- liftIO $ getObject conn $ bucketKey r bucket enck
case res of
Right o -> liftIO $
withDecryptedContent cipher (return $ obj_data o) $ \content -> do
L.writeFile f content
return True
Left e -> s3Warning e
2011-12-31 08:11:39 +00:00
remove :: Remote -> Key -> Annex Bool
remove r k = s3Action r False $ \(conn, bucket) -> do
res <- liftIO $ deleteObject conn $ bucketKey r bucket k
2011-04-19 18:50:09 +00:00
s3Bool res
2011-12-31 08:11:39 +00:00
checkPresent :: Remote -> Key -> Annex (Either String Bool)
2011-04-19 18:50:09 +00:00
checkPresent r k = s3Action r noconn $ \(conn, bucket) -> do
showAction $ "checking " ++ name r
res <- liftIO $ getObjectInfo conn $ bucketKey r bucket k
2011-03-29 22:21:05 +00:00
case res of
2011-04-19 18:50:09 +00:00
Right _ -> return $ Right True
Left (AWSError _ _) -> return $ Right False
Left e -> return $ Left (s3Error e)
where
noconn = Left $ error "S3 not configured"
s3Warning :: ReqError -> Annex Bool
s3Warning e = do
warning $ prettyReqError e
return False
s3Error :: ReqError -> a
s3Error e = error $ prettyReqError e
s3Bool :: AWSResult () -> Annex Bool
2011-07-15 16:47:14 +00:00
s3Bool (Right _) = return True
s3Bool (Left e) = s3Warning e
2011-04-19 18:50:09 +00:00
2011-12-31 08:11:39 +00:00
s3Action :: Remote -> a -> ((AWSConnection, String) -> Annex a) -> Annex a
s3Action r noconn action = do
2011-09-21 03:24:48 +00:00
when (isNothing $ config r) $
error $ "Missing configuration for special remote " ++ name r
let bucket = M.lookup "bucket" $ fromJust $ config r
conn <- s3Connection $ fromJust $ config r
case (bucket, conn) of
(Just b, Just c) -> action (c, b)
_ -> return noconn
2011-12-31 08:11:39 +00:00
bucketFile :: Remote -> Key -> FilePath
2011-07-15 16:47:14 +00:00
bucketFile r = munge . show
where
munge s = case M.lookup "mungekeys" $ fromJust $ config r of
Just "ia" -> iaMunge s
_ -> s
2011-12-31 08:11:39 +00:00
bucketKey :: Remote -> String -> Key -> S3Object
bucketKey r bucket k = S3Object bucket (bucketFile r k) "" [] L.empty
{- Internet Archive limits filenames to a subset of ascii,
- with no whitespace. Other characters are xml entity
- encoded. -}
iaMunge :: String -> String
2011-05-16 18:49:28 +00:00
iaMunge = (>>= munge)
where
munge c
| isAsciiUpper c || isAsciiLower c || isNumber c = [c]
| c `elem` "_-.\"" = [c]
| isSpace c = []
| otherwise = "&" ++ show (ord c) ++ ";"
2011-05-16 13:42:54 +00:00
genBucket :: RemoteConfig -> Annex ()
genBucket c = do
conn <- s3ConnectionRequired c
showAction "checking bucket"
2011-05-16 13:42:54 +00:00
loc <- liftIO $ getBucketLocation conn bucket
case loc of
Right _ -> return ()
Left err@(NetworkError _) -> s3Error err
Left (AWSError _ _) -> do
showAction $ "creating bucket in " ++ datacenter
2011-05-16 13:42:54 +00:00
res <- liftIO $ createBucketIn conn bucket datacenter
case res of
Right _ -> return ()
Left err -> s3Error err
where
bucket = fromJust $ M.lookup "bucket" c
datacenter = fromJust $ M.lookup "datacenter" c
2011-04-19 18:50:09 +00:00
s3ConnectionRequired :: RemoteConfig -> Annex AWSConnection
2011-05-15 06:49:43 +00:00
s3ConnectionRequired c =
maybe (error "Cannot connect to S3") return =<< s3Connection c
2011-04-19 18:50:09 +00:00
s3Connection :: RemoteConfig -> Annex (Maybe AWSConnection)
s3Connection c = do
creds <- s3GetCreds c
case creds of
Just (ak, sk) -> return $ Just $ AWSConnection host port ak sk
_ -> do
warning $ "Set both " ++ s3AccessKey ++ " and " ++ s3SecretKey ++ " to use S3"
2011-04-19 18:50:09 +00:00
return Nothing
where
2011-07-15 16:47:14 +00:00
host = fromJust $ M.lookup "host" c
port = let s = fromJust $ M.lookup "port" c in
2011-04-19 18:50:09 +00:00
case reads s of
[(p, _)] -> p
_ -> error $ "bad S3 port value: " ++ s
{- S3 creds come from the environment if set.
- Otherwise, might be stored encrypted in the remote's config. -}
s3GetCreds :: RemoteConfig -> Annex (Maybe (String, String))
2012-02-07 05:40:14 +00:00
s3GetCreds c = maybe fromconfig (return . Just) =<< liftIO getenv
where
getenv = liftM2 (,)
<$> get s3AccessKey
<*> get s3SecretKey
where
get = catchMaybeIO . getEnv
setenv (ak, sk) = do
setEnv s3AccessKey ak True
setEnv s3SecretKey sk True
fromconfig = do
mcipher <- remoteCipher c
case (M.lookup "s3creds" c, mcipher) of
2012-02-07 05:40:14 +00:00
(Just s3creds, Just cipher) ->
liftIO $ decrypt s3creds cipher
_ -> return Nothing
2012-02-07 05:40:14 +00:00
decrypt s3creds cipher = do
creds <- lines <$>
2012-02-07 05:40:14 +00:00
withDecryptedContent cipher
(return $ L.pack $ fromB64 s3creds)
(return . L.unpack)
case creds of
[ak, sk] -> do
setenv (ak, sk)
return $ Just (ak, sk)
_ -> do error "bad s3creds"
2011-04-19 18:50:09 +00:00
{- Stores S3 creds encrypted in the remote's config if possible. -}
s3SetCreds :: RemoteConfig -> Annex RemoteConfig
s3SetCreds c = do
creds <- s3GetCreds c
case creds of
Just (ak, sk) -> do
mcipher <- remoteCipher c
case mcipher of
Just cipher -> do
s <- liftIO $ withEncryptedContent cipher
(return $ L.pack $ unlines [ak, sk])
(return . L.unpack)
return $ M.insert "s3creds" (toB64 s) c
Nothing -> return c
_ -> return c
2011-04-19 18:50:09 +00:00
s3AccessKey :: String
s3AccessKey = "AWS_ACCESS_KEY_ID"
s3SecretKey :: String
s3SecretKey = "AWS_SECRET_ACCESS_KEY"