2019-07-31 19:39:01 +00:00
|
|
|
{- git-lfs API
|
|
|
|
-
|
|
|
|
- https://github.com/git-lfs/git-lfs/blob/master/docs/api
|
|
|
|
-
|
2019-08-01 17:29:43 +00:00
|
|
|
- Copyright 2019 Joey Hess <id@joeyh.name>
|
2019-07-31 19:39:01 +00:00
|
|
|
-
|
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2019-08-01 17:29:43 +00:00
|
|
|
{-# LANGUAGE DeriveGeneric, FlexibleInstances, FlexibleContexts #-}
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE LambdaCase #-}
|
|
|
|
|
|
|
|
module Utility.GitLFS (
|
|
|
|
-- * transfer requests
|
|
|
|
TransferRequest(..),
|
|
|
|
TransferAdapter(..),
|
|
|
|
TransferRequestObject(..),
|
|
|
|
startTransferRequest,
|
|
|
|
-- * responses to transfer requests
|
|
|
|
TransferResponse(..),
|
|
|
|
TransferResponseOperation(..),
|
|
|
|
IsTransferResponseOperation,
|
|
|
|
DownloadOperation,
|
|
|
|
UploadOperation,
|
|
|
|
ParsedTransferResponse,
|
|
|
|
parseTransferResponse,
|
|
|
|
-- * making transfers
|
|
|
|
downloadOperationRequest,
|
|
|
|
uploadOperationRequests,
|
|
|
|
-- * endpoint discovery
|
|
|
|
Endpoint,
|
|
|
|
guessEndpoint,
|
|
|
|
HostUser,
|
|
|
|
sshDiscoverEndpoint,
|
|
|
|
-- * errors
|
|
|
|
TransferResponseError(..),
|
|
|
|
TransferResponseObjectError(..),
|
|
|
|
-- * additional data types
|
|
|
|
Url,
|
|
|
|
SHA256,
|
|
|
|
GitRef(..),
|
|
|
|
NumSeconds,
|
|
|
|
HTTPHeader,
|
|
|
|
HTTPHeaderValue,
|
|
|
|
) where
|
|
|
|
|
2019-07-31 19:39:01 +00:00
|
|
|
-- | This implementation of the git-lfs API uses http Request and Response,
|
|
|
|
-- but leaves actually connecting up the http client to the user.
|
|
|
|
--
|
|
|
|
-- You'll want to use a Manager that supports https, since the protocol
|
|
|
|
-- uses http basic auth.
|
|
|
|
--
|
|
|
|
-- Some LFS servers, notably Github's, may require a User-Agent header
|
|
|
|
-- in some of the requests, in order to allow eg, uploads. No such header
|
|
|
|
-- is added by dedault, so be sure to add your own.
|
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
import Data.Aeson
|
|
|
|
import Data.Aeson.Types
|
|
|
|
import GHC.Generics
|
2019-07-31 19:39:01 +00:00
|
|
|
import Network.HTTP.Client
|
|
|
|
import System.Process
|
|
|
|
import Control.Exception
|
2019-07-31 20:25:13 +00:00
|
|
|
import Data.String
|
|
|
|
import Data.List
|
2019-07-29 19:47:17 +00:00
|
|
|
import qualified Data.Map as M
|
|
|
|
import qualified Data.Text as T
|
2019-07-31 16:27:27 +00:00
|
|
|
import qualified Data.Text.Encoding as E
|
2019-07-31 16:06:56 +00:00
|
|
|
import qualified Data.ByteString.Lazy as L
|
2019-07-31 16:27:27 +00:00
|
|
|
import qualified Data.CaseInsensitive as CI
|
2019-07-31 20:25:13 +00:00
|
|
|
import qualified Network.URI as URI
|
2019-07-31 16:06:56 +00:00
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
data TransferRequest = TransferRequest
|
|
|
|
{ req_operation :: TransferRequestOperation
|
|
|
|
, req_transfers :: [TransferAdapter]
|
|
|
|
, req_ref :: Maybe GitRef
|
|
|
|
, req_objects :: [TransferRequestObject]
|
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON TransferRequest where
|
|
|
|
toJSON = genericToJSON transferRequestOptions
|
|
|
|
toEncoding = genericToEncoding transferRequestOptions
|
|
|
|
|
|
|
|
instance FromJSON TransferRequest where
|
|
|
|
parseJSON = genericParseJSON transferRequestOptions
|
|
|
|
|
|
|
|
transferRequestOptions :: Options
|
2019-07-31 18:55:15 +00:00
|
|
|
transferRequestOptions = stripFieldPrefix nonNullOptions
|
2019-07-29 19:47:17 +00:00
|
|
|
|
|
|
|
data TransferRequestObject = TransferRequestObject
|
2019-07-31 18:55:15 +00:00
|
|
|
{ req_oid :: SHA256
|
|
|
|
, req_size :: Integer
|
2019-07-29 19:47:17 +00:00
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
instance ToJSON TransferRequestObject where
|
|
|
|
toJSON = genericToJSON transferRequestObjectOptions
|
|
|
|
toEncoding = genericToEncoding transferRequestObjectOptions
|
|
|
|
|
|
|
|
instance FromJSON TransferRequestObject where
|
|
|
|
parseJSON = genericParseJSON transferRequestObjectOptions
|
|
|
|
|
|
|
|
transferRequestObjectOptions :: Options
|
|
|
|
transferRequestObjectOptions = stripFieldPrefix defaultOptions
|
2019-07-29 19:47:17 +00:00
|
|
|
|
|
|
|
data TransferRequestOperation = RequestDownload | RequestUpload
|
|
|
|
deriving (Show)
|
|
|
|
|
|
|
|
instance ToJSON TransferRequestOperation where
|
|
|
|
toJSON RequestDownload = "download"
|
|
|
|
toJSON RequestUpload = "upload"
|
|
|
|
|
|
|
|
instance FromJSON TransferRequestOperation where
|
|
|
|
parseJSON (String "download") = pure RequestDownload
|
|
|
|
parseJSON (String "upload") = pure RequestUpload
|
|
|
|
parseJSON invalid = typeMismatch "TransferRequestOperation" invalid
|
|
|
|
|
|
|
|
data TransferResponse op = TransferResponse
|
2019-07-31 16:06:56 +00:00
|
|
|
{ transfer :: Maybe TransferAdapter
|
2019-07-29 19:47:17 +00:00
|
|
|
, objects :: [TransferResponseOperation op]
|
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
2019-07-31 16:06:56 +00:00
|
|
|
instance IsTransferResponseOperation op => ToJSON (TransferResponse op) where
|
|
|
|
toJSON = genericToJSON nonNullOptions
|
|
|
|
toEncoding = genericToEncoding nonNullOptions
|
|
|
|
|
|
|
|
instance IsTransferResponseOperation op => FromJSON (TransferResponse op)
|
2019-07-29 19:47:17 +00:00
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
-- | This is an error with a TransferRequest as a whole. It's also possible
|
|
|
|
-- for a TransferRequest to overall succeed, but fail for some
|
|
|
|
-- objects; such failures use TransferResponseObjectError.
|
2019-07-29 19:47:17 +00:00
|
|
|
data TransferResponseError = TransferResponseError
|
2019-07-31 18:55:15 +00:00
|
|
|
{ resperr_message :: T.Text
|
|
|
|
, resperr_request_id :: Maybe T.Text
|
|
|
|
, resperr_documentation_url :: Maybe Url
|
2019-07-29 19:47:17 +00:00
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON TransferResponseError where
|
2019-07-31 18:55:15 +00:00
|
|
|
toJSON = genericToJSON transferResponseErrorOptions
|
|
|
|
toEncoding = genericToEncoding transferResponseErrorOptions
|
2019-07-29 19:47:17 +00:00
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
instance FromJSON TransferResponseError where
|
|
|
|
parseJSON = genericParseJSON transferResponseErrorOptions
|
|
|
|
|
|
|
|
transferResponseErrorOptions :: Options
|
|
|
|
transferResponseErrorOptions = stripFieldPrefix nonNullOptions
|
|
|
|
|
|
|
|
-- | An error with a single object within a TransferRequest.
|
|
|
|
data TransferResponseObjectError = TransferResponseObjectError
|
|
|
|
{ respobjerr_code :: Int
|
|
|
|
, respobjerr_message :: T.Text
|
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON TransferResponseObjectError where
|
|
|
|
toJSON = genericToJSON transferResponseObjectErrorOptions
|
|
|
|
toEncoding = genericToEncoding transferResponseObjectErrorOptions
|
|
|
|
|
|
|
|
instance FromJSON TransferResponseObjectError where
|
|
|
|
parseJSON = genericParseJSON transferResponseObjectErrorOptions
|
|
|
|
|
|
|
|
transferResponseObjectErrorOptions :: Options
|
|
|
|
transferResponseObjectErrorOptions = stripFieldPrefix nonNullOptions
|
2019-07-29 19:47:17 +00:00
|
|
|
|
|
|
|
data TransferAdapter = Basic
|
|
|
|
deriving (Show)
|
|
|
|
|
|
|
|
instance ToJSON TransferAdapter where
|
|
|
|
toJSON Basic = "basic"
|
|
|
|
|
|
|
|
instance FromJSON TransferAdapter where
|
|
|
|
parseJSON (String "basic") = pure Basic
|
|
|
|
parseJSON invalid = typeMismatch "basic" invalid
|
|
|
|
|
|
|
|
data TransferResponseOperation op = TransferResponseOperation
|
|
|
|
{ resp_oid :: SHA256
|
|
|
|
, resp_size :: Integer
|
2019-07-31 16:06:56 +00:00
|
|
|
, resp_authenticated :: Maybe Bool
|
2019-07-31 18:55:15 +00:00
|
|
|
, resp_actions :: Maybe op
|
|
|
|
, resp_error :: Maybe TransferResponseObjectError
|
2019-07-29 19:47:17 +00:00
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON op => ToJSON (TransferResponseOperation op) where
|
|
|
|
toJSON = genericToJSON transferResponseOperationOptions
|
|
|
|
toEncoding = genericToEncoding transferResponseOperationOptions
|
|
|
|
|
|
|
|
instance FromJSON op => FromJSON (TransferResponseOperation op) where
|
|
|
|
parseJSON = genericParseJSON transferResponseOperationOptions
|
|
|
|
|
|
|
|
transferResponseOperationOptions :: Options
|
2019-07-31 18:55:15 +00:00
|
|
|
transferResponseOperationOptions = stripFieldPrefix nonNullOptions
|
2019-07-29 19:47:17 +00:00
|
|
|
|
2019-07-31 16:06:56 +00:00
|
|
|
-- | Class of types that can be responses to a transfer request,
|
|
|
|
-- that contain an operation to use to make the transfer.
|
|
|
|
class (FromJSON op, ToJSON op) => IsTransferResponseOperation op
|
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
data DownloadOperation = DownloadOperation
|
|
|
|
{ download :: OperationParams }
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
2019-07-31 16:06:56 +00:00
|
|
|
instance IsTransferResponseOperation DownloadOperation
|
2019-07-29 19:47:17 +00:00
|
|
|
instance ToJSON DownloadOperation
|
|
|
|
instance FromJSON DownloadOperation
|
|
|
|
|
|
|
|
data UploadOperation = UploadOperation
|
2019-07-31 18:55:15 +00:00
|
|
|
{ upload :: OperationParams
|
|
|
|
, verify :: Maybe OperationParams
|
|
|
|
}
|
2019-07-29 19:47:17 +00:00
|
|
|
deriving (Generic, Show)
|
|
|
|
|
2019-07-31 16:06:56 +00:00
|
|
|
instance IsTransferResponseOperation UploadOperation
|
2019-07-31 18:55:15 +00:00
|
|
|
|
|
|
|
instance ToJSON UploadOperation where
|
|
|
|
toJSON = genericToJSON nonNullOptions
|
|
|
|
toEncoding = genericToEncoding nonNullOptions
|
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
instance FromJSON UploadOperation
|
|
|
|
|
|
|
|
data OperationParams = OperationParams
|
|
|
|
{ href :: Url
|
2019-07-31 16:06:56 +00:00
|
|
|
, header :: Maybe (M.Map HTTPHeader HTTPHeaderValue)
|
2019-07-29 19:47:17 +00:00
|
|
|
, expires_in :: Maybe NumSeconds
|
|
|
|
, expires_at :: Maybe T.Text
|
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON OperationParams where
|
|
|
|
toJSON = genericToJSON nonNullOptions
|
|
|
|
toEncoding = genericToEncoding nonNullOptions
|
|
|
|
|
|
|
|
instance FromJSON OperationParams
|
|
|
|
|
2019-07-31 19:04:37 +00:00
|
|
|
data Verification = Verification
|
|
|
|
{ verification_oid :: SHA256
|
|
|
|
, verification_size :: Integer
|
|
|
|
}
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON Verification where
|
2019-08-01 17:29:43 +00:00
|
|
|
toJSON = genericToJSON verificationOptions
|
|
|
|
toEncoding = genericToEncoding verificationOptions
|
2019-07-31 19:04:37 +00:00
|
|
|
|
|
|
|
instance FromJSON Verification where
|
2019-08-01 17:29:43 +00:00
|
|
|
parseJSON = genericParseJSON verificationOptions
|
2019-07-31 19:04:37 +00:00
|
|
|
|
2019-08-01 17:29:43 +00:00
|
|
|
verificationOptions :: Options
|
|
|
|
verificationOptions = stripFieldPrefix defaultOptions
|
2019-07-31 19:04:37 +00:00
|
|
|
|
2019-07-31 19:39:01 +00:00
|
|
|
-- | Sent over ssh connection when using that to find the endpoint.
|
|
|
|
data SshDiscoveryResponse = SshDiscoveryResponse
|
|
|
|
{ endpoint_href :: Url
|
|
|
|
, endpoint_header :: Maybe (M.Map HTTPHeader HTTPHeaderValue)
|
|
|
|
, endpoint_expires_in :: Maybe NumSeconds
|
|
|
|
, endpoint_expires_at :: Maybe T.Text
|
|
|
|
} deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance ToJSON SshDiscoveryResponse where
|
|
|
|
toJSON = genericToJSON sshDiscoveryResponseOptions
|
|
|
|
toEncoding = genericToEncoding sshDiscoveryResponseOptions
|
|
|
|
|
|
|
|
instance FromJSON SshDiscoveryResponse where
|
|
|
|
parseJSON = genericParseJSON sshDiscoveryResponseOptions
|
|
|
|
|
|
|
|
sshDiscoveryResponseOptions :: Options
|
|
|
|
sshDiscoveryResponseOptions = stripFieldPrefix nonNullOptions
|
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
data GitRef = GitRef
|
|
|
|
{ name :: T.Text }
|
|
|
|
deriving (Generic, Show)
|
|
|
|
|
|
|
|
instance FromJSON GitRef
|
|
|
|
instance ToJSON GitRef
|
|
|
|
|
|
|
|
type SHA256 = T.Text
|
|
|
|
|
2019-07-31 20:06:59 +00:00
|
|
|
-- | The endpoint of a git-lfs server.
|
|
|
|
data Endpoint
|
2019-07-31 20:25:13 +00:00
|
|
|
= EndpointURI URI.URI
|
2019-07-31 20:06:59 +00:00
|
|
|
| EndpointDiscovered SshDiscoveryResponse
|
2019-07-31 20:25:13 +00:00
|
|
|
deriving (Show)
|
2019-07-31 19:39:01 +00:00
|
|
|
|
|
|
|
-- | Discovers an LFS endpoint for a git remote using ssh.
|
|
|
|
--
|
|
|
|
-- May generate console output, including error messages from ssh or the
|
|
|
|
-- remote server, and ssh password prompting.
|
2019-08-02 14:40:55 +00:00
|
|
|
--
|
|
|
|
-- Note that this does not sanitize the hostname. It is the responsibility
|
|
|
|
-- of the caller to avoid calling this with a value that ssh will
|
|
|
|
-- interpert as an option, such as "-oProxyCommand="
|
2019-07-31 20:06:59 +00:00
|
|
|
sshDiscoverEndpoint :: HostUser -> FilePath -> TransferRequestOperation -> IO (Maybe Endpoint)
|
|
|
|
sshDiscoverEndpoint hostuser remotepath tro =
|
2019-07-31 19:39:01 +00:00
|
|
|
(try (readProcess "ssh" ps "") :: IO (Either IOError String)) >>= \case
|
|
|
|
Left _err -> return Nothing
|
2019-07-31 20:06:59 +00:00
|
|
|
Right resp -> return $
|
|
|
|
EndpointDiscovered <$> decode (fromString resp)
|
2019-07-31 19:39:01 +00:00
|
|
|
where
|
|
|
|
ps =
|
|
|
|
[ hostuser
|
|
|
|
, "git-lfs-authenticate"
|
|
|
|
, remotepath
|
|
|
|
, case tro of
|
|
|
|
RequestDownload -> "download"
|
|
|
|
RequestUpload -> "upload"
|
|
|
|
]
|
|
|
|
|
2019-07-31 20:25:13 +00:00
|
|
|
-- | Guesses the LFS endpoint from the http url of a git remote.
|
|
|
|
--
|
|
|
|
-- https://github.com/git-lfs/git-lfs/blob/master/docs/api/server-discovery.md
|
|
|
|
guessEndpoint :: Url -> Maybe Endpoint
|
|
|
|
guessEndpoint remoteurl = do
|
|
|
|
uri <- URI.parseURI (T.unpack remoteurl)
|
|
|
|
let guessedpath
|
|
|
|
| ".git" `isSuffixOf` URI.uriPath uri =
|
|
|
|
URI.uriPath uri ++ "/info/lfs"
|
|
|
|
| ".git/" `isSuffixOf` URI.uriPath uri =
|
|
|
|
URI.uriPath uri ++ "info/lfs"
|
|
|
|
| otherwise = (droptrailing '/' (URI.uriPath uri)) ++ ".git/info/lfs"
|
|
|
|
let endpoint = EndpointURI $ uri
|
|
|
|
{ URI.uriScheme = "https"
|
|
|
|
, URI.uriPath = guessedpath
|
|
|
|
}
|
|
|
|
case URI.uriScheme uri of
|
|
|
|
"https:" -> Just endpoint
|
|
|
|
"http:" -> Just endpoint
|
|
|
|
_ -> Nothing
|
|
|
|
where
|
|
|
|
droptrailing c = reverse . dropWhile (== c) . reverse
|
|
|
|
|
2019-07-31 20:06:59 +00:00
|
|
|
-- | Makes a Request that will start the process of making a transfer to or
|
|
|
|
-- from the LFS endpoint.
|
|
|
|
startTransferRequest :: Endpoint -> TransferRequest -> Maybe Request
|
2019-07-31 20:25:13 +00:00
|
|
|
startTransferRequest (EndpointURI uri) tr = do
|
|
|
|
r <- requestFromURI uri
|
2019-07-31 20:06:59 +00:00
|
|
|
return $ addLfsJsonHeaders $ r
|
|
|
|
-- Since this uses the LFS batch API, it adds /objects/batch
|
|
|
|
-- to the endpoint url.
|
|
|
|
{ path = path r <> "/objects/batch"
|
|
|
|
, method = "POST"
|
|
|
|
, requestBody = RequestBodyLBS (encode tr)
|
|
|
|
}
|
|
|
|
startTransferRequest (EndpointDiscovered sr) tr = do
|
2019-07-31 20:25:13 +00:00
|
|
|
uri <- URI.parseURI (T.unpack (endpoint_href sr))
|
|
|
|
req <- startTransferRequest (EndpointURI uri) tr
|
2019-07-31 20:06:59 +00:00
|
|
|
let headers = map convheader $ maybe [] M.toList $ endpoint_header sr
|
|
|
|
return $ req { requestHeaders = requestHeaders req ++ headers }
|
|
|
|
where
|
|
|
|
convheader (k, v) = (CI.mk (E.encodeUtf8 k), E.encodeUtf8 v)
|
|
|
|
|
2019-07-31 19:39:01 +00:00
|
|
|
-- | "user@host" or just the hostname.
|
|
|
|
type HostUser = String
|
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
addLfsJsonHeaders :: Request -> Request
|
|
|
|
addLfsJsonHeaders r = r
|
|
|
|
{ requestHeaders =
|
2019-07-31 17:22:33 +00:00
|
|
|
[ ("Accept", lfsjson)
|
|
|
|
, ("Content-Type", lfsjson)
|
|
|
|
]
|
|
|
|
}
|
|
|
|
where
|
|
|
|
lfsjson = "application/vnd.git-lfs+json"
|
|
|
|
|
|
|
|
type ParsedTransferResponse op =
|
|
|
|
Either (Either String TransferResponseError) (TransferResponse op)
|
|
|
|
|
|
|
|
-- | Parse the body of a response to a transfer request.
|
2019-08-01 17:29:43 +00:00
|
|
|
parseTransferResponse
|
2019-07-31 17:22:33 +00:00
|
|
|
:: IsTransferResponseOperation op
|
|
|
|
=> L.ByteString
|
|
|
|
-> ParsedTransferResponse op
|
2019-08-01 17:29:43 +00:00
|
|
|
parseTransferResponse resp = case eitherDecode resp of
|
2019-07-31 17:22:33 +00:00
|
|
|
-- If unable to decode as a TransferResponse, try to decode
|
|
|
|
-- as a TransferResponseError instead, in case the LFS server
|
|
|
|
-- sent an error message.
|
|
|
|
Left err -> case eitherDecode resp of
|
|
|
|
Right responseerror -> Left (Right responseerror)
|
|
|
|
Left _ -> Left $ Left err
|
|
|
|
Right tr -> Right tr
|
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
-- | Builds a http request to perform a download.
|
|
|
|
downloadOperationRequest :: DownloadOperation -> Maybe Request
|
|
|
|
downloadOperationRequest = operationParamsRequest . download
|
2019-07-31 17:22:33 +00:00
|
|
|
|
2019-07-31 18:55:15 +00:00
|
|
|
-- | Builds http request to perform an upload. The content to upload is
|
|
|
|
-- provided in the RequestBody, along with its SHA256 and size.
|
2019-07-31 17:22:33 +00:00
|
|
|
--
|
2019-07-31 18:55:15 +00:00
|
|
|
-- If the LFS server requested verification, there will be a second
|
|
|
|
-- Request that does that; it should be run only after the upload has
|
|
|
|
-- succeeded.
|
2019-08-01 17:29:43 +00:00
|
|
|
uploadOperationRequests :: UploadOperation -> RequestBody -> SHA256 -> Integer -> Maybe [Request]
|
|
|
|
uploadOperationRequests op content oid size =
|
2019-07-31 18:55:15 +00:00
|
|
|
case (mkdlreq, mkverifyreq) of
|
|
|
|
(Nothing, _) -> Nothing
|
|
|
|
(Just dlreq, Nothing) -> Just [dlreq]
|
|
|
|
(Just dlreq, Just verifyreq) -> Just [dlreq, verifyreq]
|
|
|
|
where
|
|
|
|
mkdlreq = mkdlreq'
|
|
|
|
<$> operationParamsRequest (upload op)
|
|
|
|
mkdlreq' r = r
|
|
|
|
{ method = "PUT"
|
|
|
|
, requestBody = content
|
|
|
|
}
|
|
|
|
mkverifyreq = mkverifyreq'
|
|
|
|
<$> (operationParamsRequest =<< verify op)
|
|
|
|
mkverifyreq' r = addLfsJsonHeaders $ r
|
|
|
|
{ method = "POST"
|
|
|
|
, requestBody = RequestBodyLBS $ encode $
|
2019-07-31 19:04:37 +00:00
|
|
|
Verification oid size
|
2019-07-31 18:55:15 +00:00
|
|
|
}
|
|
|
|
|
|
|
|
operationParamsRequest :: OperationParams -> Maybe Request
|
|
|
|
operationParamsRequest ps = do
|
|
|
|
r <- parseRequest (T.unpack (href ps))
|
|
|
|
let headers = map convheader $ maybe [] M.toList (header ps)
|
|
|
|
return $ r { requestHeaders = headers }
|
2019-07-31 17:22:33 +00:00
|
|
|
where
|
|
|
|
convheader (k, v) = (CI.mk (E.encodeUtf8 k), E.encodeUtf8 v)
|
|
|
|
|
2019-07-29 19:47:17 +00:00
|
|
|
type Url = T.Text
|
|
|
|
|
|
|
|
type NumSeconds = Integer
|
|
|
|
|
|
|
|
type HTTPHeader = T.Text
|
|
|
|
|
|
|
|
type HTTPHeaderValue = T.Text
|
|
|
|
|
|
|
|
-- Prevent Nothing from serializing to null.
|
|
|
|
nonNullOptions :: Options
|
|
|
|
nonNullOptions = defaultOptions { omitNothingFields = True }
|
2019-07-31 18:55:15 +00:00
|
|
|
|
|
|
|
-- Remove prefix from field names.
|
|
|
|
stripFieldPrefix :: Options -> Options
|
|
|
|
stripFieldPrefix o =
|
|
|
|
o { fieldLabelModifier = drop 1 . dropWhile (/= '_') }
|