git-annex/Command/AddUrl.hs

82 lines
2.3 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
2011-10-04 04:40:47 +00:00
import Annex.Content
import Logs.Web
import qualified Option
2011-07-01 21:15:46 +00:00
def :: [Command]
def = [withOptions [fileOption] $
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
seek :: [CommandSeek]
seek = [withField fileOption return $ \f ->
withStrings $ start f]
2011-07-01 21:15:46 +00:00
start :: Maybe FilePath -> String -> CommandStart
2012-02-09 18:19:58 +00:00
start optfile 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
let file = fromMaybe (url2file url) optfile
2011-07-01 21:15:46 +00:00
showStart "addurl" file
next $ perform s file
2011-10-31 20:46:51 +00:00
2011-07-01 21:15:46 +00:00
perform :: String -> FilePath -> CommandPerform
perform url file = ifAnnexed file addurl geturl
where
geturl = do
whenM (liftIO $ doesFileExist file) $
2012-02-08 19:49:42 +00:00
error $ "not overwriting existing " ++ file
fast <- Annex.getState Annex.fast
if fast then nodownload url file else download url file
addurl (key, _backend) = do
setUrlPresent key url
next $ return True
download :: String -> FilePath -> CommandPerform
download url file = do
showAction $ "downloading " ++ url ++ " "
let dummykey = Backend.URL.fromUrl url
tmp <- fromRepo $ gitAnnexTmpLocation dummykey
liftIO $ createDirectoryIfMissing True (parentDir tmp)
stopUnless (downloadUrl [url] tmp) $ do
[(backend, _)] <- Backend.chooseBackends [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
let key = Backend.URL.fromUrl url
setUrlPresent key url
next $ Command.Add.cleanup file key False
url2file :: URI -> FilePath
url2file url = escape $ uriRegName auth ++ uriPath url ++ uriQuery url
2011-07-01 21:15:46 +00:00
where
2011-09-09 04:11:32 +00:00
escape = replace "/" "_" . replace "?" "_"
auth = fromMaybe (error $ "bad url " ++ show url) $ uriAuthority url