git-annex/Command/AddUrl.hs

102 lines
3.2 KiB
Haskell
Raw Normal View History

2011-07-01 21:15:46 +00:00
{- git-annex command
-
- Copyright 2011 Joey Hess <joey@kitenet.net>
-
- Licensed under the GNU GPL version 3 or higher.
-}
module Command.AddUrl where
import Network.URI
2011-10-05 20:02:51 +00:00
import Common.Annex
2011-07-01 21:15:46 +00:00
import Command
import qualified Backend
import qualified Command.Add
import qualified Annex
import qualified Backend.URL
import qualified Utility.Url as Url
2011-10-04 04:40:47 +00:00
import Annex.Content
import Logs.Web
import qualified Option
import Types.Key
2011-07-01 21:15:46 +00:00
def :: [Command]
2012-02-16 16:25:19 +00:00
def = [withOptions [fileOption, pathdepthOption] $
command "addurl" (paramRepeating paramUrl) seek "add urls to annex"]
fileOption :: Option
fileOption = Option.field [] "file" paramFile "specify what file the url is added to"
2011-07-01 21:15:46 +00:00
2012-02-16 16:25:19 +00:00
pathdepthOption :: Option
2012-02-16 16:37:30 +00:00
pathdepthOption = Option.field [] "pathdepth" paramNumber "path components to use in filename"
2012-02-16 16:25:19 +00:00
2011-07-01 21:15:46 +00:00
seek :: [CommandSeek]
seek = [withField fileOption return $ \f ->
2012-02-16 16:25:19 +00:00
withField pathdepthOption (return . maybe Nothing readish) $ \d ->
withStrings $ start f d]
2011-07-01 21:15:46 +00:00
2012-02-16 16:25:19 +00:00
start :: Maybe FilePath -> Maybe Int -> String -> CommandStart
start optfile pathdepth s = notBareRepo $ go $ fromMaybe bad $ parseURI s
2011-10-31 20:46:51 +00:00
where
2012-02-09 18:19:58 +00:00
bad = fromMaybe (error $ "bad url " ++ s) $
parseURI $ escapeURIString isUnescapedInURI s
go url = do
2012-02-16 16:25:19 +00:00
let file = fromMaybe (url2file url pathdepth) optfile
2011-07-01 21:15:46 +00:00
showStart "addurl" file
2012-02-16 16:25:19 +00:00
next $ perform s file pathdepth
2011-10-31 20:46:51 +00:00
2012-02-16 16:25:19 +00:00
perform :: String -> FilePath -> Maybe Int -> CommandPerform
perform url file pathdepth = ifAnnexed file addurl geturl
where
geturl = do
liftIO $ createDirectoryIfMissing True (parentDir file)
fast <- Annex.getState Annex.fast
if fast then nodownload url file else download url file
addurl (key, _backend) = do
2012-02-16 16:25:19 +00:00
when (pathdepth /= Nothing) $
error $ file ++ " already exists"
unlessM (liftIO $ Url.check url (keySize key)) $
error $ "failed to verify url: " ++ url
setUrlPresent key url
next $ return True
download :: String -> FilePath -> CommandPerform
download url file = do
showAction $ "downloading " ++ url ++ " "
let dummykey = Backend.URL.fromUrl url Nothing
tmp <- fromRepo $ gitAnnexTmpLocation dummykey
liftIO $ createDirectoryIfMissing True (parentDir tmp)
stopUnless (downloadUrl [url] tmp) $ do
backend <- Backend.chooseBackend file
k <- Backend.genKey tmp backend
case k of
Nothing -> stop
Just (key, _) -> do
moveAnnex key tmp
setUrlPresent key url
next $ Command.Add.cleanup file key True
2011-07-01 21:15:46 +00:00
nodownload :: String -> FilePath -> CommandPerform
nodownload url file = do
(exists, size) <- liftIO $ Url.exists url
unless exists $
error $ "unable to access url: " ++ url
let key = Backend.URL.fromUrl url size
setUrlPresent key url
next $ Command.Add.cleanup file key False
2012-02-16 16:25:19 +00:00
url2file :: URI -> Maybe Int -> FilePath
url2file url pathdepth = case pathdepth of
Nothing -> filesize $ escape fullurl
Just depth
| depth > 0 -> frombits $ drop depth
| otherwise -> frombits $ reverse . take (negate depth) . reverse
2011-07-01 21:15:46 +00:00
where
2012-02-16 16:25:19 +00:00
fullurl = uriRegName auth ++ uriPath url ++ uriQuery url
frombits a = filesize $ join "/" $ a urlbits
urlbits = map escape $ filter (not . null) $ split "/" fullurl
auth = fromMaybe (error $ "bad url " ++ show url) $ uriAuthority url
2012-02-16 16:25:19 +00:00
filesize = take 255
escape = replace "/" "_" . replace "?" "_"