2012-11-24 20:30:15 +00:00
|
|
|
{- git-annex assistant webapp configurators for Amazon AWS services
|
|
|
|
-
|
2015-01-21 16:50:09 +00:00
|
|
|
- Copyright 2012 Joey Hess <id@joeyh.name>
|
2012-11-24 20:30:15 +00:00
|
|
|
-
|
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2020-09-08 16:42:59 +00:00
|
|
|
{-# LANGUAGE QuasiQuotes, TemplateHaskell, OverloadedStrings #-}
|
2012-11-24 20:30:15 +00:00
|
|
|
|
|
|
|
module Assistant.WebApp.Configurators.AWS where
|
|
|
|
|
2012-11-25 04:26:46 +00:00
|
|
|
import Assistant.WebApp.Common
|
2013-10-28 15:33:14 +00:00
|
|
|
import Assistant.WebApp.MakeRemote
|
2012-11-24 20:30:15 +00:00
|
|
|
import qualified Remote.S3 as S3
|
|
|
|
import Logs.Remote
|
|
|
|
import qualified Remote
|
2013-04-27 19:16:06 +00:00
|
|
|
import qualified Types.Remote as Remote
|
2015-10-13 17:24:44 +00:00
|
|
|
import qualified Remote.Glacier as Glacier
|
|
|
|
import qualified Remote.Helper.AWS as AWS
|
2012-11-24 20:30:15 +00:00
|
|
|
import Types.Remote (RemoteConfig)
|
|
|
|
import Types.StandardGroups
|
2013-04-27 19:16:06 +00:00
|
|
|
import Creds
|
2013-09-26 20:09:45 +00:00
|
|
|
import Assistant.Gpg
|
2013-11-07 22:02:00 +00:00
|
|
|
import Git.Types (RemoteName)
|
2019-10-10 17:08:17 +00:00
|
|
|
import Annex.SpecialRemote.Config
|
2020-01-10 18:10:20 +00:00
|
|
|
import Types.ProposedAccepted
|
2012-11-24 20:30:15 +00:00
|
|
|
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import qualified Data.Map as M
|
2013-01-14 16:54:29 +00:00
|
|
|
import Data.Char
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
awsConfigurator :: Widget -> Handler Html
|
2012-12-30 03:10:18 +00:00
|
|
|
awsConfigurator = page "Add an Amazon repository" (Just Configuration)
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
glacierConfigurator :: Widget -> Handler Html
|
2012-11-24 20:30:15 +00:00
|
|
|
glacierConfigurator a = do
|
2021-02-02 23:01:45 +00:00
|
|
|
ifM (liftIO $ inSearchPath "glacier")
|
2012-11-24 20:30:15 +00:00
|
|
|
( awsConfigurator a
|
|
|
|
, awsConfigurator needglaciercli
|
|
|
|
)
|
|
|
|
where
|
|
|
|
needglaciercli = $(widgetFile "configurators/needglaciercli")
|
|
|
|
|
2020-06-16 16:04:29 +00:00
|
|
|
data StorageClass
|
|
|
|
= StandardRedundancy
|
|
|
|
| StandardInfrequentAccess
|
2012-11-24 20:30:15 +00:00
|
|
|
deriving (Eq, Enum, Bounded)
|
|
|
|
|
|
|
|
instance Show StorageClass where
|
|
|
|
show StandardRedundancy = "STANDARD"
|
2015-09-17 21:20:01 +00:00
|
|
|
show StandardInfrequentAccess = "STANDARD_IA"
|
2012-11-24 20:30:15 +00:00
|
|
|
|
|
|
|
data AWSInput = AWSInput
|
|
|
|
{ accessKeyID :: Text
|
|
|
|
, secretAccessKey :: Text
|
|
|
|
, datacenter :: Text
|
|
|
|
-- Only used for S3, not Glacier.
|
|
|
|
, storageClass :: StorageClass
|
|
|
|
, repoName :: Text
|
2012-12-04 17:28:22 +00:00
|
|
|
, enableEncryption :: EnableEncryption
|
2012-11-24 20:30:15 +00:00
|
|
|
}
|
|
|
|
|
|
|
|
data AWSCreds = AWSCreds Text Text
|
|
|
|
|
|
|
|
extractCreds :: AWSInput -> AWSCreds
|
|
|
|
extractCreds i = AWSCreds (accessKeyID i) (secretAccessKey i)
|
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
s3InputAForm :: Maybe CredPair -> MkAForm AWSInput
|
2013-04-27 19:16:06 +00:00
|
|
|
s3InputAForm defcreds = AWSInput
|
|
|
|
<$> accessKeyIDFieldWithHelp (T.pack . fst <$> defcreds)
|
|
|
|
<*> secretAccessKeyField (T.pack . snd <$> defcreds)
|
2012-12-03 02:33:30 +00:00
|
|
|
<*> datacenterField AWS.S3
|
2014-04-18 00:07:09 +00:00
|
|
|
<*> areq (selectFieldList storageclasses) (bfs "Storage class") (Just StandardRedundancy)
|
|
|
|
<*> areq textField (bfs "Repository name") (Just "S3")
|
2012-12-04 17:28:22 +00:00
|
|
|
<*> enableEncryptionField
|
2012-11-24 20:30:15 +00:00
|
|
|
where
|
|
|
|
storageclasses :: [(Text, StorageClass)]
|
|
|
|
storageclasses =
|
|
|
|
[ ("Standard redundancy", StandardRedundancy)
|
2015-09-17 21:20:01 +00:00
|
|
|
, ("Infrequent access (cheaper for backups and archives)", StandardInfrequentAccess)
|
2012-11-24 20:30:15 +00:00
|
|
|
]
|
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
glacierInputAForm :: Maybe CredPair -> MkAForm AWSInput
|
2013-04-27 19:16:06 +00:00
|
|
|
glacierInputAForm defcreds = AWSInput
|
|
|
|
<$> accessKeyIDFieldWithHelp (T.pack . fst <$> defcreds)
|
|
|
|
<*> secretAccessKeyField (T.pack . snd <$> defcreds)
|
2012-12-03 02:33:30 +00:00
|
|
|
<*> datacenterField AWS.Glacier
|
2012-11-24 20:30:15 +00:00
|
|
|
<*> pure StandardRedundancy
|
2014-04-18 00:07:09 +00:00
|
|
|
<*> areq textField (bfs "Repository name") (Just "glacier")
|
2012-12-04 17:28:22 +00:00
|
|
|
<*> enableEncryptionField
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
awsCredsAForm :: Maybe CredPair -> MkAForm AWSCreds
|
2013-04-27 19:16:06 +00:00
|
|
|
awsCredsAForm defcreds = AWSCreds
|
|
|
|
<$> accessKeyIDFieldWithHelp (T.pack . fst <$> defcreds)
|
|
|
|
<*> secretAccessKeyField (T.pack . snd <$> defcreds)
|
2012-12-03 02:33:30 +00:00
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
accessKeyIDField :: Widget -> Maybe Text -> MkAForm Text
|
2014-04-18 00:07:09 +00:00
|
|
|
accessKeyIDField help = areq (textField `withNote` help) (bfs "Access Key ID")
|
2013-04-25 16:23:36 +00:00
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
accessKeyIDFieldWithHelp :: Maybe Text -> MkAForm Text
|
2013-10-02 05:06:59 +00:00
|
|
|
accessKeyIDFieldWithHelp = accessKeyIDField help
|
2012-12-03 02:33:30 +00:00
|
|
|
where
|
|
|
|
help = [whamlet|
|
|
|
|
<a href="https://portal.aws.amazon.com/gp/aws/securityCredentials#id_block">
|
|
|
|
Get Amazon access keys
|
|
|
|
|]
|
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
secretAccessKeyField :: Maybe Text -> MkAForm Text
|
2014-04-18 00:07:09 +00:00
|
|
|
secretAccessKeyField = areq passwordField (bfs "Secret Access Key")
|
2012-12-03 02:33:30 +00:00
|
|
|
|
2013-06-03 20:33:05 +00:00
|
|
|
datacenterField :: AWS.Service -> MkAForm Text
|
2014-04-18 00:07:09 +00:00
|
|
|
datacenterField service = areq (selectFieldList list) (bfs "Datacenter") defregion
|
2012-12-03 02:33:30 +00:00
|
|
|
where
|
|
|
|
list = M.toList $ AWS.regionMap service
|
|
|
|
defregion = Just $ AWS.defaultRegion service
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
getAddS3R :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getAddS3R = postAddS3R
|
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
postAddS3R :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postAddS3R = awsConfigurator $ do
|
2013-04-27 19:16:06 +00:00
|
|
|
defcreds <- liftAnnex previouslyUsedAWSCreds
|
2013-06-03 17:51:54 +00:00
|
|
|
((result, form), enctype) <- liftH $
|
2014-04-18 00:07:09 +00:00
|
|
|
runFormPostNoToken $ renderBootstrap3 bootstrapFormLayout $ s3InputAForm defcreds
|
2012-11-24 20:30:15 +00:00
|
|
|
case result of
|
2013-06-03 17:51:54 +00:00
|
|
|
FormSuccess input -> liftH $ do
|
2012-11-24 20:30:15 +00:00
|
|
|
let name = T.unpack $ repoName input
|
2013-09-27 04:15:50 +00:00
|
|
|
makeAWSRemote initSpecialRemote S3.remote TransferGroup (extractCreds input) name $ M.fromList
|
2012-12-04 17:28:22 +00:00
|
|
|
[ configureEncryption $ enableEncryption input
|
2020-01-10 18:10:20 +00:00
|
|
|
, (typeField, Proposed "S3")
|
|
|
|
, (Proposed "datacenter", Proposed $ T.unpack $ datacenter input)
|
|
|
|
, (Proposed "storageclass", Proposed $ show $ storageClass input)
|
|
|
|
, (Proposed "chunk", Proposed "1MiB")
|
2012-11-24 20:30:15 +00:00
|
|
|
]
|
2012-11-25 04:38:11 +00:00
|
|
|
_ -> $(widgetFile "configurators/adds3")
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
getAddGlacierR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getAddGlacierR = postAddGlacierR
|
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
postAddGlacierR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postAddGlacierR = glacierConfigurator $ do
|
2013-04-27 19:16:06 +00:00
|
|
|
defcreds <- liftAnnex previouslyUsedAWSCreds
|
2013-06-03 17:51:54 +00:00
|
|
|
((result, form), enctype) <- liftH $
|
2014-04-18 00:07:09 +00:00
|
|
|
runFormPostNoToken $ renderBootstrap3 bootstrapFormLayout $ glacierInputAForm defcreds
|
2012-11-24 20:30:15 +00:00
|
|
|
case result of
|
2013-06-03 17:51:54 +00:00
|
|
|
FormSuccess input -> liftH $ do
|
2012-11-24 20:30:15 +00:00
|
|
|
let name = T.unpack $ repoName input
|
2013-09-27 04:15:50 +00:00
|
|
|
makeAWSRemote initSpecialRemote Glacier.remote SmallArchiveGroup (extractCreds input) name $ M.fromList
|
2012-12-04 17:28:22 +00:00
|
|
|
[ configureEncryption $ enableEncryption input
|
2020-01-10 18:10:20 +00:00
|
|
|
, (typeField, Proposed "glacier")
|
|
|
|
, (Proposed "datacenter", Proposed $ T.unpack $ datacenter input)
|
2012-11-24 20:30:15 +00:00
|
|
|
]
|
2012-11-25 04:38:11 +00:00
|
|
|
_ -> $(widgetFile "configurators/addglacier")
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
getEnableS3R :: UUID -> Handler Html
|
2013-04-25 17:14:49 +00:00
|
|
|
getEnableS3R uuid = do
|
2020-09-22 17:52:26 +00:00
|
|
|
m <- liftAnnex remoteConfigMap
|
2020-01-15 17:47:31 +00:00
|
|
|
isia <- case M.lookup uuid m of
|
|
|
|
Just c -> liftAnnex $ do
|
fix encryption of content to gcrypt and git-lfs
Fix serious regression in gcrypt and encrypted git-lfs remotes.
Since version 7.20200202.7, git-annex incorrectly stored content
on those remotes without encrypting it.
Problem was, Remote.Git enumerates all git remotes, including git-lfs
and gcrypt. It then dispatches to those. So, Remote.List used the
RemoteConfigParser from Remote.Git, instead of from git-lfs or gcrypt,
and that parser does not know about encryption fields, so did not
include them in the ParsedRemoteConfig. (Also didn't include other
fields specific to those remotes, perhaps chunking etc also didn't
get through.)
To fix, had to move RemoteConfig parsing down into the generate methods
of each remote, rather than doing it in Remote.List.
And a consequence of that was that ParsedRemoteConfig had to change to
include the RemoteConfig that got parsed, so that testremote can
generate a new remote based on an existing remote.
(I would have rather fixed this just inside Remote.Git, but that was not
practical, at least not w/o re-doing work that Remote.List already did.
Big ugly mostly mechanical patch seemed preferable to making git-annex
slower.)
2020-02-26 21:20:56 +00:00
|
|
|
pc <- parsedRemoteConfig S3.remote c
|
2020-01-15 17:47:31 +00:00
|
|
|
return $ S3.configIA pc
|
|
|
|
Nothing -> return False
|
|
|
|
if isia
|
2013-04-25 17:14:49 +00:00
|
|
|
then redirect $ EnableIAR uuid
|
|
|
|
else postEnableS3R uuid
|
2013-03-16 22:48:23 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
postEnableS3R :: UUID -> Handler Html
|
2013-04-25 17:14:49 +00:00
|
|
|
postEnableS3R uuid = awsConfigurator $ enableAWSRemote S3.remote uuid
|
2012-11-24 20:30:15 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
getEnableGlacierR :: UUID -> Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getEnableGlacierR = postEnableGlacierR
|
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
postEnableGlacierR :: UUID -> Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postEnableGlacierR = glacierConfigurator . enableAWSRemote Glacier.remote
|
2012-11-24 20:30:15 +00:00
|
|
|
|
|
|
|
enableAWSRemote :: RemoteType -> UUID -> Widget
|
|
|
|
enableAWSRemote remotetype uuid = do
|
2013-04-27 19:16:06 +00:00
|
|
|
defcreds <- liftAnnex previouslyUsedAWSCreds
|
2013-06-03 17:51:54 +00:00
|
|
|
((result, form), enctype) <- liftH $
|
2014-04-18 00:07:09 +00:00
|
|
|
runFormPostNoToken $ renderBootstrap3 bootstrapFormLayout $ awsCredsAForm defcreds
|
2012-11-24 20:30:15 +00:00
|
|
|
case result of
|
2013-06-03 17:51:54 +00:00
|
|
|
FormSuccess creds -> liftH $ do
|
2020-09-22 17:52:26 +00:00
|
|
|
m <- liftAnnex remoteConfigMap
|
2019-10-10 17:08:17 +00:00
|
|
|
let name = fromJust $ lookupName $
|
2012-11-24 20:30:15 +00:00
|
|
|
fromJust $ M.lookup uuid m
|
2013-09-27 04:15:50 +00:00
|
|
|
makeAWSRemote enableSpecialRemote remotetype SmallArchiveGroup creds name M.empty
|
2012-11-24 20:30:15 +00:00
|
|
|
_ -> do
|
2013-03-16 04:12:28 +00:00
|
|
|
description <- liftAnnex $
|
2013-04-03 21:01:40 +00:00
|
|
|
T.pack <$> Remote.prettyUUID uuid
|
2012-11-24 20:30:15 +00:00
|
|
|
$(widgetFile "configurators/enableaws")
|
|
|
|
|
2013-09-27 04:15:50 +00:00
|
|
|
makeAWSRemote :: SpecialRemoteMaker -> RemoteType -> StandardGroup -> AWSCreds -> RemoteName -> RemoteConfig -> Handler ()
|
2014-02-11 18:06:50 +00:00
|
|
|
makeAWSRemote maker remotetype defaultgroup (AWSCreds ak sk) name config =
|
2013-09-29 18:39:10 +00:00
|
|
|
setupCloudRemote defaultgroup Nothing $
|
2014-02-11 18:06:50 +00:00
|
|
|
maker hostname remotetype (Just creds) config
|
2013-01-14 16:54:29 +00:00
|
|
|
where
|
2014-10-09 18:53:13 +00:00
|
|
|
creds = (T.unpack ak, T.unpack sk)
|
2013-01-14 16:54:29 +00:00
|
|
|
{- AWS services use the remote name as the basis for a host
|
|
|
|
- name, so filter it to contain valid characters. -}
|
|
|
|
hostname = case filter isAlphaNum name of
|
|
|
|
[] -> "aws"
|
|
|
|
n -> n
|
2013-04-25 20:42:17 +00:00
|
|
|
|
|
|
|
getRepoInfo :: RemoteConfig -> Widget
|
|
|
|
getRepoInfo c = [whamlet|S3 remote using bucket: #{bucket}|]
|
|
|
|
where
|
2020-01-10 18:10:20 +00:00
|
|
|
bucket = maybe "" fromProposedAccepted $ M.lookup (Accepted "bucket") c
|
2013-04-27 19:16:06 +00:00
|
|
|
|
|
|
|
previouslyUsedAWSCreds :: Annex (Maybe CredPair)
|
|
|
|
previouslyUsedAWSCreds = getM gettype [S3.remote, Glacier.remote]
|
|
|
|
where
|
|
|
|
gettype t = previouslyUsedCredPair AWS.creds t $
|
2014-10-23 19:56:35 +00:00
|
|
|
not . S3.configIA . Remote.config
|