2012-08-31 19:17:12 +00:00
|
|
|
{- git-annex assistant webapp configurators for making local repositories
|
|
|
|
-
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
2012-09-24 18:48:47 +00:00
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
2012-08-31 19:17:12 +00:00
|
|
|
-}
|
|
|
|
|
2013-06-05 01:02:09 +00:00
|
|
|
{-# LANGUAGE CPP, QuasiQuotes, TemplateHaskell, OverloadedStrings, RankNTypes, KindSignatures, TypeFamilies #-}
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
module Assistant.WebApp.Configurators.Local where
|
|
|
|
|
2012-11-25 04:26:46 +00:00
|
|
|
import Assistant.WebApp.Common
|
2013-02-19 00:37:26 +00:00
|
|
|
import Assistant.WebApp.OtherRepos
|
2013-09-18 00:02:42 +00:00
|
|
|
import Assistant.WebApp.Gpg
|
2012-09-11 01:55:59 +00:00
|
|
|
import Assistant.MakeRemote
|
2013-04-08 19:36:09 +00:00
|
|
|
import Assistant.Sync
|
2012-08-31 19:17:12 +00:00
|
|
|
import Init
|
|
|
|
import qualified Git
|
|
|
|
import qualified Git.Construct
|
|
|
|
import qualified Git.Config
|
2012-10-30 23:12:05 +00:00
|
|
|
import qualified Git.Command
|
2012-08-31 19:17:12 +00:00
|
|
|
import qualified Annex
|
2013-04-23 15:38:52 +00:00
|
|
|
import Config.Files
|
2012-08-31 19:17:12 +00:00
|
|
|
import Utility.FreeDesktop
|
2013-03-12 09:48:41 +00:00
|
|
|
#ifdef WITH_CLIBS
|
2012-08-31 19:17:12 +00:00
|
|
|
import Utility.Mounts
|
2013-03-12 09:48:41 +00:00
|
|
|
#endif
|
2012-08-31 19:17:12 +00:00
|
|
|
import Utility.DiskFree
|
|
|
|
import Utility.DataUnits
|
|
|
|
import Utility.Network
|
2013-04-03 21:01:40 +00:00
|
|
|
import Remote (prettyUUID)
|
2012-10-09 18:24:17 +00:00
|
|
|
import Annex.UUID
|
2012-10-10 20:04:28 +00:00
|
|
|
import Types.StandardGroups
|
2012-10-10 19:35:10 +00:00
|
|
|
import Logs.PreferredContent
|
2013-03-20 20:46:35 +00:00
|
|
|
import Logs.UUID
|
2012-10-25 22:17:32 +00:00
|
|
|
import Utility.UserInfo
|
2013-01-01 18:01:47 +00:00
|
|
|
import Config
|
2013-09-16 20:07:27 +00:00
|
|
|
import Utility.Gpg
|
|
|
|
import qualified Annex.Branch
|
|
|
|
import qualified Remote.GCrypt as GCrypt
|
|
|
|
import qualified Types.Remote
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
import qualified Data.Text as T
|
2013-03-20 20:46:35 +00:00
|
|
|
import qualified Data.Map as M
|
2012-08-31 19:17:12 +00:00
|
|
|
import Data.Char
|
2013-09-16 20:07:27 +00:00
|
|
|
import Data.Ord
|
2013-06-27 05:15:28 +00:00
|
|
|
import qualified Text.Hamlet as Hamlet
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
data RepositoryPath = RepositoryPath Text
|
|
|
|
deriving Show
|
|
|
|
|
|
|
|
{- Custom field display for a RepositoryPath, with an icon etc.
|
|
|
|
-
|
|
|
|
- Validates that the path entered is not empty, and is a safe value
|
|
|
|
- to use as a repository. -}
|
2013-06-03 20:33:05 +00:00
|
|
|
#if MIN_VERSION_yesod(1,2,0)
|
2013-06-02 19:57:22 +00:00
|
|
|
repositoryPathField :: forall (m :: * -> *). (MonadIO m, HandlerSite m ~ WebApp) => Bool -> Field m Text
|
2013-06-03 20:33:05 +00:00
|
|
|
#else
|
|
|
|
repositoryPathField :: forall sub. Bool -> Field sub WebApp Text
|
|
|
|
#endif
|
2012-11-18 17:21:19 +00:00
|
|
|
repositoryPathField autofocus = Field
|
2013-03-10 19:43:10 +00:00
|
|
|
#if ! MIN_VERSION_yesod_form(1,2,0)
|
2012-11-18 17:21:19 +00:00
|
|
|
{ fieldParse = parse
|
|
|
|
#else
|
|
|
|
{ fieldParse = \l _ -> parse l
|
|
|
|
, fieldEnctype = UrlEncoded
|
|
|
|
#endif
|
2013-03-10 19:43:10 +00:00
|
|
|
, fieldView = view
|
2012-11-18 17:21:19 +00:00
|
|
|
}
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
view idAttr nameAttr attrs val isReq =
|
|
|
|
[whamlet|<input type="text" *{attrs} id="#{idAttr}" name="#{nameAttr}" :isReq:required :autofocus:autofocus value="#{either id id val}">|]
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2012-10-31 06:34:03 +00:00
|
|
|
parse [path]
|
|
|
|
| T.null path = nopath
|
|
|
|
| otherwise = liftIO $ checkRepositoryPath path
|
|
|
|
parse [] = return $ Right Nothing
|
|
|
|
parse _ = nopath
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2012-10-31 06:34:03 +00:00
|
|
|
nopath = return $ Left "Enter a location for the repository"
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
{- As well as checking the path for a lot of silly things, tilde is
|
|
|
|
- expanded in the returned path. -}
|
|
|
|
checkRepositoryPath :: Text -> IO (Either (SomeMessage WebApp) (Maybe Text))
|
|
|
|
checkRepositoryPath p = do
|
|
|
|
home <- myHomeDir
|
|
|
|
let basepath = expandTilde home $ T.unpack p
|
|
|
|
path <- absPath basepath
|
|
|
|
let parent = parentDir path
|
|
|
|
problems <- catMaybes <$> mapM runcheck
|
|
|
|
[ (return $ path == "/", "Enter the full path to use for the repository.")
|
|
|
|
, (return $ all isSpace basepath, "A blank path? Seems unlikely.")
|
|
|
|
, (doesFileExist path, "A file already exists with that name.")
|
|
|
|
, (return $ path == home, "Sorry, using git-annex for your whole home directory is not currently supported.")
|
|
|
|
, (not <$> doesDirectoryExist parent, "Parent directory does not exist.")
|
|
|
|
, (not <$> canWrite path, "Cannot write a repository there.")
|
|
|
|
]
|
|
|
|
return $
|
|
|
|
case headMaybe problems of
|
|
|
|
Nothing -> Right $ Just $ T.pack basepath
|
|
|
|
Just prob -> Left prob
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
runcheck (chk, msg) = ifM (chk) ( return $ Just msg, return Nothing )
|
|
|
|
expandTilde home ('~':'/':path) = home </> path
|
|
|
|
expandTilde _ path = path
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
{- On first run, if run in the home directory, default to putting it in
|
|
|
|
- ~/Desktop/annex, when a Desktop directory exists, and ~/annex otherwise.
|
|
|
|
-
|
2012-09-28 20:04:49 +00:00
|
|
|
- If run in another directory, that the user can write to,
|
2013-04-20 22:53:04 +00:00
|
|
|
- the user probably wants to put it there. Unless that directory
|
|
|
|
- contains a git-annex file, in which case the user has probably
|
|
|
|
- browsed to a directory with git-annex and run it from there. -}
|
2012-08-31 19:17:12 +00:00
|
|
|
defaultRepositoryPath :: Bool -> IO FilePath
|
|
|
|
defaultRepositoryPath firstrun = do
|
|
|
|
cwd <- liftIO $ getCurrentDirectory
|
|
|
|
home <- myHomeDir
|
|
|
|
if home == cwd && firstrun
|
2012-09-28 20:04:49 +00:00
|
|
|
then inhome
|
2013-04-20 22:53:04 +00:00
|
|
|
else ifM (legit cwd <&&> canWrite cwd)
|
|
|
|
( return cwd
|
|
|
|
, inhome
|
|
|
|
)
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
inhome = do
|
|
|
|
desktop <- userDesktopDir
|
|
|
|
ifM (doesDirectoryExist desktop)
|
|
|
|
( relHome $ desktop </> gitAnnexAssistantDefaultDir
|
|
|
|
, return $ "~" </> gitAnnexAssistantDefaultDir
|
|
|
|
)
|
2013-04-20 22:53:04 +00:00
|
|
|
legit d = not <$> doesFileExist (d </> "git-annex")
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
newRepositoryForm :: FilePath -> Hamlet.Html -> MkMForm RepositoryPath
|
2012-09-18 21:50:07 +00:00
|
|
|
newRepositoryForm defpath msg = do
|
|
|
|
(pathRes, pathView) <- mreq (repositoryPathField True) ""
|
|
|
|
(Just $ T.pack $ addTrailingPathSeparator defpath)
|
2012-08-31 19:17:12 +00:00
|
|
|
let (err, errmsg) = case pathRes of
|
|
|
|
FormMissing -> (False, "")
|
|
|
|
FormFailure l -> (True, concat $ map T.unpack l)
|
|
|
|
FormSuccess _ -> (False, "")
|
|
|
|
let form = do
|
|
|
|
webAppFormAuthToken
|
2012-09-18 21:50:07 +00:00
|
|
|
$(widgetFile "configurators/newrepository/form")
|
2012-08-31 19:17:12 +00:00
|
|
|
return (RepositoryPath <$> pathRes, form)
|
|
|
|
|
|
|
|
{- Making the first repository, when starting the webapp for the first time. -}
|
2013-06-27 05:15:28 +00:00
|
|
|
getFirstRepositoryR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getFirstRepositoryR = postFirstRepositoryR
|
2013-06-27 05:15:28 +00:00
|
|
|
postFirstRepositoryR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postFirstRepositoryR = page "Getting started" (Just Configuration) $ do
|
2013-05-03 19:21:31 +00:00
|
|
|
#ifdef __ANDROID__
|
|
|
|
androidspecial <- liftIO $ doesDirectoryExist "/sdcard/DCIM"
|
|
|
|
let path = "/sdcard/annex"
|
|
|
|
#else
|
|
|
|
let androidspecial = False
|
2013-06-03 17:51:54 +00:00
|
|
|
path <- liftIO . defaultRepositoryPath =<< liftH inFirstRun
|
2013-05-03 19:21:31 +00:00
|
|
|
#endif
|
2013-06-03 17:51:54 +00:00
|
|
|
((res, form), enctype) <- liftH $ runFormPost $ newRepositoryForm path
|
2012-08-31 19:17:12 +00:00
|
|
|
case res of
|
2013-06-03 17:51:54 +00:00
|
|
|
FormSuccess (RepositoryPath p) -> liftH $
|
2013-06-10 20:41:02 +00:00
|
|
|
startFullAssistant (T.unpack p) ClientGroup Nothing
|
2012-09-18 21:50:07 +00:00
|
|
|
_ -> $(widgetFile "configurators/newrepository/first")
|
|
|
|
|
2013-05-03 19:21:31 +00:00
|
|
|
getAndroidCameraRepositoryR :: Handler ()
|
2013-06-10 20:41:02 +00:00
|
|
|
getAndroidCameraRepositoryR =
|
|
|
|
startFullAssistant "/sdcard/DCIM" SourceGroup $ Just addignore
|
|
|
|
where
|
|
|
|
addignore = do
|
|
|
|
liftIO $ unlessM (doesFileExist ".gitignore") $
|
|
|
|
writeFile ".gitignore" ".thumbnails/*"
|
|
|
|
void $ inRepo $
|
|
|
|
Git.Command.runBool [Param "add", File ".gitignore"]
|
2013-05-03 19:21:31 +00:00
|
|
|
|
2013-02-19 00:37:26 +00:00
|
|
|
{- Adding a new local repository, which may be entirely separate, or may
|
|
|
|
- be connected to the current repository. -}
|
2013-06-27 05:15:28 +00:00
|
|
|
getNewRepositoryR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getNewRepositoryR = postNewRepositoryR
|
2013-06-27 05:15:28 +00:00
|
|
|
postNewRepositoryR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postNewRepositoryR = page "Add another repository" (Just Configuration) $ do
|
2012-09-18 21:50:07 +00:00
|
|
|
home <- liftIO myHomeDir
|
2013-06-03 17:51:54 +00:00
|
|
|
((res, form), enctype) <- liftH $ runFormPost $ newRepositoryForm home
|
2012-09-18 21:50:07 +00:00
|
|
|
case res of
|
2013-02-19 00:37:26 +00:00
|
|
|
FormSuccess (RepositoryPath p) -> do
|
2012-09-18 21:50:07 +00:00
|
|
|
let path = T.unpack p
|
2013-03-12 12:09:31 +00:00
|
|
|
isnew <- liftIO $ makeRepo path False
|
|
|
|
u <- liftIO $ initRepo isnew True path Nothing
|
2013-06-03 17:51:54 +00:00
|
|
|
liftH $ liftAnnexOr () $ setStandardGroup u ClientGroup
|
2013-03-03 21:07:27 +00:00
|
|
|
liftIO $ addAutoStartFile path
|
2013-02-19 00:37:26 +00:00
|
|
|
liftIO $ startAssistant path
|
|
|
|
askcombine u path
|
2012-09-18 21:50:07 +00:00
|
|
|
_ -> $(widgetFile "configurators/newrepository")
|
2013-02-19 00:37:26 +00:00
|
|
|
where
|
|
|
|
askcombine newrepouuid newrepopath = do
|
|
|
|
newrepo <- liftIO $ relHome newrepopath
|
2013-06-03 17:51:54 +00:00
|
|
|
mainrepo <- fromJust . relDir <$> liftH getYesod
|
2013-02-19 00:37:26 +00:00
|
|
|
$(widgetFile "configurators/newrepository/combine")
|
|
|
|
|
2013-09-27 04:31:12 +00:00
|
|
|
getCombineRepositoryR :: FilePath -> UUID -> Handler Html
|
|
|
|
getCombineRepositoryR newrepopath newrepouuid = do
|
2013-02-19 00:37:26 +00:00
|
|
|
r <- combineRepos newrepopath remotename
|
2013-04-08 19:36:09 +00:00
|
|
|
liftAssistant $ syncRemote r
|
2013-02-19 00:37:26 +00:00
|
|
|
redirect $ EditRepositoryR newrepouuid
|
|
|
|
where
|
|
|
|
remotename = takeFileName newrepopath
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
selectDriveForm :: [RemovableDrive] -> Hamlet.Html -> MkMForm RemovableDrive
|
2013-03-20 20:46:35 +00:00
|
|
|
selectDriveForm drives = renderBootstrap $ RemovableDrive
|
2012-08-31 19:17:12 +00:00
|
|
|
<$> pure Nothing
|
2013-03-20 20:46:35 +00:00
|
|
|
<*> areq (selectFieldList pairs) "Select drive:" Nothing
|
|
|
|
<*> areq textField "Use this directory on the drive:"
|
|
|
|
(Just $ T.pack gitAnnexAssistantDefaultDir)
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
pairs = zip (map describe drives) (map mountPoint drives)
|
|
|
|
describe drive = case diskFree drive of
|
|
|
|
Nothing -> mountPoint drive
|
|
|
|
Just free ->
|
|
|
|
let sz = roughSize storageUnits True free
|
|
|
|
in T.unwords
|
|
|
|
[ mountPoint drive
|
|
|
|
, T.concat ["(", T.pack sz]
|
|
|
|
, "free)"
|
|
|
|
]
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2013-03-20 20:46:35 +00:00
|
|
|
removableDriveRepository :: RemovableDrive -> FilePath
|
|
|
|
removableDriveRepository drive =
|
|
|
|
T.unpack (mountPoint drive) </> T.unpack (driveRepoPath drive)
|
|
|
|
|
|
|
|
{- Adding a removable drive. -}
|
2013-06-27 05:15:28 +00:00
|
|
|
getAddDriveR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
getAddDriveR = postAddDriveR
|
2013-06-27 05:15:28 +00:00
|
|
|
postAddDriveR :: Handler Html
|
2013-03-16 22:48:23 +00:00
|
|
|
postAddDriveR = page "Add a removable drive" (Just Configuration) $ do
|
2012-08-31 19:17:12 +00:00
|
|
|
removabledrives <- liftIO $ driveList
|
|
|
|
writabledrives <- liftIO $
|
|
|
|
filterM (canWrite . T.unpack . mountPoint) removabledrives
|
2013-06-03 17:51:54 +00:00
|
|
|
((res, form), enctype) <- liftH $ runFormPost $
|
2013-03-20 20:46:35 +00:00
|
|
|
selectDriveForm (sort writabledrives)
|
2012-08-31 19:17:12 +00:00
|
|
|
case res of
|
2013-06-03 17:51:54 +00:00
|
|
|
FormSuccess drive -> liftH $ redirect $ ConfirmAddDriveR drive
|
2012-11-25 04:38:11 +00:00
|
|
|
_ -> $(widgetFile "configurators/adddrive")
|
2013-03-20 20:46:35 +00:00
|
|
|
|
|
|
|
{- The repo may already exist, when adding removable media
|
|
|
|
- that has already been used elsewhere. If so, check
|
|
|
|
- the UUID of the repo and see if it's one we know. If not,
|
2013-09-16 20:07:27 +00:00
|
|
|
- the user must confirm the repository merge.
|
|
|
|
-
|
|
|
|
- If the repo does not already exist on the drive, prompt about
|
|
|
|
- encryption. -}
|
2013-06-27 05:15:28 +00:00
|
|
|
getConfirmAddDriveR :: RemovableDrive -> Handler Html
|
2013-09-18 19:30:53 +00:00
|
|
|
getConfirmAddDriveR drive = ifM (liftIO $ probeRepoExists dir)
|
2013-09-16 20:07:27 +00:00
|
|
|
( do
|
2013-09-18 19:30:53 +00:00
|
|
|
mu <- liftIO $ probeUUID dir
|
2013-09-16 20:07:27 +00:00
|
|
|
case mu of
|
2013-09-18 19:30:53 +00:00
|
|
|
Nothing -> maybe askcombine isknownuuid
|
|
|
|
=<< liftIO (probeGCryptRemoteUUID dir)
|
|
|
|
Just driveuuid -> isknownuuid driveuuid
|
2013-09-16 20:07:27 +00:00
|
|
|
, newrepo
|
|
|
|
)
|
2013-03-20 20:46:35 +00:00
|
|
|
where
|
|
|
|
dir = removableDriveRepository drive
|
2013-09-16 20:07:27 +00:00
|
|
|
newrepo = do
|
|
|
|
secretkeys <- sortBy (comparing snd) . M.toList
|
|
|
|
<$> liftIO secretKeys
|
|
|
|
page "Encrypt repository?" (Just Configuration) $
|
|
|
|
$(widgetFile "configurators/adddrive/encrypt")
|
2013-09-17 19:36:15 +00:00
|
|
|
knownrepo = getFinishAddDriveR drive NoRepoKey
|
2013-09-16 20:07:27 +00:00
|
|
|
askcombine = page "Combine repositories?" (Just Configuration) $
|
|
|
|
$(widgetFile "configurators/adddrive/combine")
|
2013-09-18 19:30:53 +00:00
|
|
|
isknownuuid driveuuid =
|
|
|
|
ifM (M.member driveuuid <$> liftAnnex uuidMap)
|
|
|
|
( knownrepo
|
|
|
|
, askcombine
|
|
|
|
)
|
2013-03-20 20:46:35 +00:00
|
|
|
|
2013-09-16 20:46:00 +00:00
|
|
|
setupDriveModal :: Widget
|
|
|
|
setupDriveModal = $(widgetFile "configurators/adddrive/setupmodal")
|
2013-03-20 20:46:35 +00:00
|
|
|
|
2013-09-17 19:36:15 +00:00
|
|
|
getGenKeyForDriveR :: RemovableDrive -> Handler Html
|
2013-09-26 20:09:45 +00:00
|
|
|
getGenKeyForDriveR drive = withNewSecretKey $ \keyid -> do
|
2013-09-18 00:02:42 +00:00
|
|
|
{- Generating a key takes a long time, and
|
|
|
|
- the removable drive may have been disconnected
|
|
|
|
- in the meantime. Check that it is still mounted
|
|
|
|
- before finishing. -}
|
|
|
|
ifM (liftIO $ any (\d -> mountPoint d == mountPoint drive) <$> driveList)
|
2013-09-26 20:09:45 +00:00
|
|
|
( getFinishAddDriveR drive (RepoKey keyid)
|
2013-09-18 00:02:42 +00:00
|
|
|
, getAddDriveR
|
2013-09-17 19:36:15 +00:00
|
|
|
)
|
|
|
|
|
|
|
|
getFinishAddDriveR :: RemovableDrive -> RepoKey -> Handler Html
|
|
|
|
getFinishAddDriveR drive = go
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
2013-09-18 19:30:53 +00:00
|
|
|
{- Set up new gcrypt special remote. -}
|
2013-09-26 16:40:19 +00:00
|
|
|
go (RepoKey keyid) = whenGcryptInstalled $ makewith $ const $ do
|
2013-09-26 20:09:45 +00:00
|
|
|
r <- liftAnnex $ addRemote $
|
|
|
|
makeGCryptRemote remotename dir keyid
|
2013-09-26 16:40:19 +00:00
|
|
|
return (Types.Remote.uuid r, r)
|
2013-09-27 05:03:50 +00:00
|
|
|
go NoRepoKey = checkGCryptRepoEncryption dir makeunencrypted $ do
|
|
|
|
mu <- liftIO $ probeGCryptRemoteUUID dir
|
|
|
|
case mu of
|
|
|
|
Just u -> enablegcryptremote u
|
|
|
|
Nothing -> error "The drive contains a gcrypt repository that is not a git-annex special remote. This is not supported."
|
2013-09-18 19:30:53 +00:00
|
|
|
enablegcryptremote u = do
|
|
|
|
mname <- liftAnnex $ getGCryptRemoteName u dir
|
|
|
|
case mname of
|
2013-09-19 16:53:24 +00:00
|
|
|
Nothing -> error $ "Cannot find configuration for the gcrypt remote at " ++ dir
|
2013-09-18 19:30:53 +00:00
|
|
|
Just name -> makewith $ const $ do
|
|
|
|
r <- liftAnnex $ addRemote $
|
|
|
|
enableSpecialRemote name GCrypt.remote $ M.fromList
|
|
|
|
[("gitrepo", dir)]
|
|
|
|
return (u, r)
|
|
|
|
{- Making a new unencrypted repo, or combining with an existing one. -}
|
|
|
|
makeunencrypted = makewith $ \isnew -> (,)
|
|
|
|
<$> liftIO (initRepo isnew False dir $ Just remotename)
|
|
|
|
<*> combineRepos dir remotename
|
2013-09-16 20:35:27 +00:00
|
|
|
makewith a = do
|
2013-03-12 12:09:31 +00:00
|
|
|
liftIO $ createDirectoryIfMissing True dir
|
|
|
|
isnew <- liftIO $ makeRepo dir True
|
2013-07-23 17:38:05 +00:00
|
|
|
{- Removable drives are not reliable media, so enable fsync. -}
|
|
|
|
liftIO $ inDir dir $
|
|
|
|
setConfig (ConfigKey "core.fsyncobjectfiles")
|
2013-07-23 17:40:27 +00:00
|
|
|
(Git.Config.boolConfig True)
|
2013-09-16 20:35:27 +00:00
|
|
|
(u, r) <- a isnew
|
2013-03-04 20:36:38 +00:00
|
|
|
liftAnnex $ setStandardGroup u TransferGroup
|
2013-04-08 19:36:09 +00:00
|
|
|
liftAssistant $ syncRemote r
|
2013-09-16 20:35:27 +00:00
|
|
|
redirect $ EditNewRepositoryR u
|
2013-03-20 20:46:35 +00:00
|
|
|
mountpoint = T.unpack (mountPoint drive)
|
|
|
|
dir = removableDriveRepository drive
|
|
|
|
remotename = takeFileName mountpoint
|
2013-02-19 00:37:26 +00:00
|
|
|
|
|
|
|
{- Each repository is made a remote of the other.
|
|
|
|
- Next call syncRemote to get them in sync. -}
|
|
|
|
combineRepos :: FilePath -> String -> Handler Remote
|
2013-03-04 20:36:38 +00:00
|
|
|
combineRepos dir name = liftAnnex $ do
|
2013-02-19 00:37:26 +00:00
|
|
|
hostname <- maybe "host" id <$> liftIO getHostname
|
|
|
|
hostlocation <- fromRepo Git.repoLocation
|
|
|
|
liftIO $ inDir dir $ void $ makeGitRemote hostname hostlocation
|
|
|
|
addRemote $ makeGitRemote name dir
|
2012-09-02 19:06:27 +00:00
|
|
|
|
2013-06-27 05:15:28 +00:00
|
|
|
getEnableDirectoryR :: UUID -> Handler Html
|
2012-12-30 03:10:18 +00:00
|
|
|
getEnableDirectoryR uuid = page "Enable a repository" (Just Configuration) $ do
|
2013-04-03 21:01:40 +00:00
|
|
|
description <- liftAnnex $ T.pack <$> prettyUUID uuid
|
2012-09-13 20:47:44 +00:00
|
|
|
$(widgetFile "configurators/enabledirectory")
|
|
|
|
|
2012-08-31 19:17:12 +00:00
|
|
|
{- List of removable drives. -}
|
|
|
|
driveList :: IO [RemovableDrive]
|
2013-03-12 09:48:41 +00:00
|
|
|
#ifdef WITH_CLIBS
|
2012-08-31 19:17:12 +00:00
|
|
|
driveList = mapM (gen . mnt_dir) =<< filter sane <$> getMounts
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
gen dir = RemovableDrive
|
|
|
|
<$> getDiskFree dir
|
|
|
|
<*> pure (T.pack dir)
|
2013-03-20 20:46:35 +00:00
|
|
|
<*> pure (T.pack gitAnnexAssistantDefaultDir)
|
2012-10-31 06:34:03 +00:00
|
|
|
-- filter out some things that are surely not removable drives
|
|
|
|
sane Mntent { mnt_dir = dir, mnt_fsname = dev }
|
|
|
|
{- We want real disks like /dev/foo, not
|
|
|
|
- dummy mount points like proc or tmpfs or
|
|
|
|
- gvfs-fuse-daemon. -}
|
|
|
|
| not ('/' `elem` dev) = False
|
|
|
|
{- Just in case: These mount points are surely not
|
|
|
|
- removable disks. -}
|
|
|
|
| dir == "/" = False
|
|
|
|
| dir == "/tmp" = False
|
|
|
|
| dir == "/run/shm" = False
|
|
|
|
| dir == "/run/lock" = False
|
2013-05-04 20:04:17 +00:00
|
|
|
#ifdef __ANDROID__
|
|
|
|
| dir == "/mnt/sdcard" = False
|
|
|
|
| dir == "/sdcard" = False
|
|
|
|
#endif
|
2012-10-31 06:34:03 +00:00
|
|
|
| otherwise = True
|
2013-03-12 09:48:41 +00:00
|
|
|
#else
|
|
|
|
driveList = return []
|
|
|
|
#endif
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
{- Bootstraps from first run mode to a fully running assistant in a
|
|
|
|
- repository, by running the postFirstRun callback, which returns the
|
|
|
|
- url to the new webapp. -}
|
2013-06-10 20:41:02 +00:00
|
|
|
startFullAssistant :: FilePath -> StandardGroup -> Maybe (Annex ())-> Handler ()
|
|
|
|
startFullAssistant path repogroup setup = do
|
2012-08-31 19:17:12 +00:00
|
|
|
webapp <- getYesod
|
|
|
|
url <- liftIO $ do
|
2013-03-12 12:09:31 +00:00
|
|
|
isnew <- makeRepo path False
|
|
|
|
u <- initRepo isnew True path Nothing
|
2013-06-10 20:41:02 +00:00
|
|
|
inDir path $ do
|
|
|
|
setStandardGroup u repogroup
|
|
|
|
maybe noop id setup
|
2013-03-03 21:07:27 +00:00
|
|
|
addAutoStartFile path
|
2013-05-11 23:14:30 +00:00
|
|
|
setCurrentDirectory path
|
2012-08-31 19:17:12 +00:00
|
|
|
fromJust $ postFirstRun webapp
|
|
|
|
redirect $ T.pack url
|
|
|
|
|
2013-03-12 12:09:31 +00:00
|
|
|
{- Makes a new git repository. Or, if a git repository already
|
|
|
|
- exists, returns False. -}
|
|
|
|
makeRepo :: FilePath -> Bool -> IO Bool
|
2013-09-18 19:30:53 +00:00
|
|
|
makeRepo path bare = ifM (probeRepoExists path)
|
2013-03-12 12:09:31 +00:00
|
|
|
( return False
|
|
|
|
, do
|
|
|
|
(transcript, ok) <-
|
|
|
|
processTranscript "git" (toCommand params) Nothing
|
|
|
|
unless ok $
|
|
|
|
error $ "git init failed!\nOutput:\n" ++ transcript
|
|
|
|
return True
|
|
|
|
)
|
2012-10-31 06:34:03 +00:00
|
|
|
where
|
|
|
|
baseparams = [Param "init", Param "--quiet"]
|
|
|
|
params
|
|
|
|
| bare = baseparams ++ [Param "--bare", File path]
|
|
|
|
| otherwise = baseparams ++ [File path]
|
2012-08-31 19:17:12 +00:00
|
|
|
|
2013-09-16 20:07:27 +00:00
|
|
|
{- Runs an action in the git repository in the specified directory. -}
|
2012-08-31 19:17:12 +00:00
|
|
|
inDir :: FilePath -> Annex a -> IO a
|
|
|
|
inDir dir a = do
|
|
|
|
state <- Annex.new =<< Git.Config.read =<< Git.Construct.fromPath dir
|
|
|
|
Annex.eval state a
|
|
|
|
|
2013-03-12 12:09:31 +00:00
|
|
|
{- Creates a new repository, and returns its UUID. -}
|
|
|
|
initRepo :: Bool -> Bool -> FilePath -> Maybe String -> IO UUID
|
|
|
|
initRepo True primary_assistant_repo dir desc = inDir dir $ do
|
2013-07-05 16:24:28 +00:00
|
|
|
initRepo' desc
|
2013-03-03 18:07:13 +00:00
|
|
|
{- Initialize the master branch, so things that expect
|
|
|
|
- to have it will work, before any files are added. -}
|
2012-10-30 23:12:05 +00:00
|
|
|
unlessM (Git.Config.isBare <$> gitRepo) $
|
2013-03-03 17:39:07 +00:00
|
|
|
void $ inRepo $ Git.Command.runBool
|
|
|
|
[ Param "commit"
|
|
|
|
, Param "--quiet"
|
2012-10-31 17:42:07 +00:00
|
|
|
, Param "--allow-empty"
|
2012-10-30 23:12:05 +00:00
|
|
|
, Param "-m"
|
|
|
|
, Param "created repository"
|
|
|
|
]
|
2013-03-03 18:07:13 +00:00
|
|
|
{- Repositories directly managed by the assistant use direct mode.
|
|
|
|
-
|
|
|
|
- Automatic gc is disabled, as it can be slow. Insted, gc is done
|
|
|
|
- once a day.
|
|
|
|
-}
|
|
|
|
when primary_assistant_repo $ do
|
2012-12-28 20:42:11 +00:00
|
|
|
setDirect True
|
2013-03-03 18:07:13 +00:00
|
|
|
inRepo $ Git.Command.run
|
|
|
|
[Param "config", Param "gc.auto", Param "0"]
|
2012-10-09 18:24:17 +00:00
|
|
|
getUUID
|
2013-03-12 12:09:31 +00:00
|
|
|
{- Repo already exists, could be a non-git-annex repo though. -}
|
2013-03-12 19:47:30 +00:00
|
|
|
initRepo False _ dir desc = inDir dir $ do
|
2013-07-05 16:24:28 +00:00
|
|
|
initRepo' desc
|
|
|
|
getUUID
|
|
|
|
|
|
|
|
initRepo' :: Maybe String -> Annex ()
|
|
|
|
initRepo' desc = do
|
2013-09-16 18:56:19 +00:00
|
|
|
unlessM isInitialized $ do
|
2013-03-12 12:09:31 +00:00
|
|
|
initialize desc
|
2013-09-16 18:56:19 +00:00
|
|
|
{- Ensure branch gets committed right away so it is
|
|
|
|
- available for merging when a removable drive repo is being
|
|
|
|
- added. -}
|
|
|
|
Annex.Branch.commit "update"
|
2012-08-31 19:17:12 +00:00
|
|
|
|
|
|
|
{- Checks if the user can write to a directory.
|
|
|
|
-
|
|
|
|
- The directory may be in the process of being created; if so
|
|
|
|
- the parent directory is checked instead. -}
|
|
|
|
canWrite :: FilePath -> IO Bool
|
|
|
|
canWrite dir = do
|
|
|
|
tocheck <- ifM (doesDirectoryExist dir)
|
|
|
|
(return dir, return $ parentDir dir)
|
|
|
|
catchBoolIO $ fileAccess tocheck False True False
|
2013-09-18 19:30:53 +00:00
|
|
|
|
|
|
|
{- Checks if a git repo exists at a location. -}
|
|
|
|
probeRepoExists :: FilePath -> IO Bool
|
|
|
|
probeRepoExists dir = isJust <$>
|
|
|
|
catchDefaultIO Nothing (Git.Construct.checkForRepo dir)
|
|
|
|
|
|
|
|
{- Gets the UUID of the git repo at a location, which may not exist, or
|
|
|
|
- not be a git-annex repo. -}
|
|
|
|
probeUUID :: FilePath -> IO (Maybe UUID)
|
|
|
|
probeUUID dir = catchDefaultIO Nothing $ inDir dir $ do
|
|
|
|
u <- getUUID
|
|
|
|
return $ if u == NoUUID then Nothing else Just u
|
|
|
|
|
|
|
|
{- Gets the UUID of the gcrypt repo at a location, which may not exist.
|
|
|
|
- Only works if the gcrypt repo was created as a git-annex remote. -}
|
|
|
|
probeGCryptRemoteUUID :: FilePath -> IO (Maybe UUID)
|
|
|
|
probeGCryptRemoteUUID dir = catchDefaultIO Nothing $ do
|
2013-09-24 21:25:47 +00:00
|
|
|
GCrypt.getGCryptUUID =<< Git.Construct.fromAbsPath dir
|