git-annex/Assistant/WebApp/Configurators/Local.hs

420 lines
15 KiB
Haskell
Raw Normal View History

2012-08-31 19:17:12 +00:00
{- git-annex assistant webapp configurators for making local repositories
-
- Copyright 2012-2014 Joey Hess <id@joeyh.name>
2012-08-31 19:17:12 +00:00
-
- Licensed under the GNU AGPL version 3 or higher.
2012-08-31 19:17:12 +00:00
-}
2015-05-10 19:56:07 +00:00
{-# LANGUAGE CPP, QuasiQuotes, TemplateHaskell, OverloadedStrings #-}
2015-05-10 19:54:58 +00:00
{-# LANGUAGE RankNTypes, KindSignatures, TypeFamilies, FlexibleContexts #-}
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
import Assistant.WebApp.Gpg
2013-10-28 15:33:14 +00:00
import Assistant.WebApp.MakeRemote
import Assistant.Sync
import Assistant.Restart
2014-06-16 22:59:23 +00:00
import Annex.MakeRepo
import qualified Annex
2012-08-31 19:17:12 +00:00
import qualified Git
import qualified Git.Config
import qualified Git.Command
import qualified Command.Sync
2013-04-23 15:38:52 +00:00
import Config.Files
2012-08-31 19:17:12 +00:00
import Utility.FreeDesktop
2013-12-10 05:26:52 +00:00
import Utility.DiskFree
2016-05-05 19:53:31 +00:00
#ifndef mingw32_HOST_OS
2012-08-31 19:17:12 +00:00
import Utility.Mounts
2016-05-05 19:53:31 +00:00
#endif
2012-08-31 19:17:12 +00:00
import Utility.DataUnits
import Remote (prettyUUID)
import Annex.UUID
import Types.StandardGroups
import Logs.PreferredContent
2013-03-20 20:46:35 +00:00
import Logs.UUID
import Utility.UserInfo
import Config
import Utility.Gpg
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
import Data.Ord
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-02 19:57:22 +00:00
repositoryPathField :: forall (m :: * -> *). (MonadIO m, HandlerSite m ~ WebApp) => Bool -> Field m Text
2012-11-18 17:21:19 +00:00
repositoryPathField autofocus = Field
{ fieldParse = \l _ -> parse l
, fieldEnctype = UrlEncoded
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
2012-08-31 19:17:12 +00:00
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
2013-10-02 04:42:27 +00:00
runcheck (chk, msg) = ifM chk ( return $ Just msg, return Nothing )
2012-10-31 06:34:03 +00:00
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.
-
- If run in another directory, that the user can write to,
- 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
#ifndef mingw32_HOST_OS
home <- myHomeDir
currdir <- liftIO getCurrentDirectory
if home == currdir && firstrun
then inhome
else ifM (legit currdir <&&> canWrite currdir)
( return currdir
, inhome
)
#else
-- On Windows, always default to ~/Desktop/annex or ~/annex,
-- no cwd handling because the user might be able to write
-- to the entire drive.
if firstrun then inhome else inhome
#endif
2012-10-31 06:34:03 +00:00
where
inhome = do
desktop <- userDesktopDir
ifM (doesDirectoryExist desktop <&&> canWrite desktop)
2012-10-31 06:34:03 +00:00
( relHome $ desktop </> gitAnnexAssistantDefaultDir
, return $ "~" </> gitAnnexAssistantDefaultDir
)
#ifndef mingw32_HOST_OS
-- Avoid using eg, standalone build's git-annex.linux/ directory
-- when run from there.
legit d = not <$> doesFileExist (d </> "git-annex")
#endif
2012-08-31 19:17:12 +00:00
newRepositoryForm :: FilePath -> Hamlet.Html -> MkMForm RepositoryPath
newRepositoryForm defpath msg = do
2014-04-18 00:07:09 +00:00
(pathRes, pathView) <- mreq (repositoryPathField True) (bfs "")
(Just $ T.pack $ addTrailingPathSeparator defpath)
2012-08-31 19:17:12 +00:00
let (err, errmsg) = case pathRes of
FormMissing -> (False, "")
2013-10-02 04:42:27 +00:00
FormFailure l -> (True, concatMap T.unpack l)
2012-08-31 19:17:12 +00:00
FormSuccess _ -> (False, "")
let form = do
webAppFormAuthToken
$(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. -}
getFirstRepositoryR :: Handler Html
2013-03-16 22:48:23 +00:00
getFirstRepositoryR = postFirstRepositoryR
postFirstRepositoryR :: Handler Html
2013-03-16 22:48:23 +00:00
postFirstRepositoryR = page "Getting started" (Just Configuration) $ do
unlessM (liftIO $ inPath "git") $
giveup "You need to install git in order to use git-annex!"
#ifdef __ANDROID__
androidspecial <- liftIO $ doesDirectoryExist "/sdcard/DCIM"
let path = "/sdcard/annex"
#else
let androidspecial = False
path <- liftIO . defaultRepositoryPath =<< liftH inFirstRun
#endif
((res, form), enctype) <- liftH $ runFormPostNoToken $ newRepositoryForm path
2012-08-31 19:17:12 +00:00
case res of
FormSuccess (RepositoryPath p) -> liftH $
startFullAssistant (T.unpack p) ClientGroup Nothing
_ -> $(widgetFile "configurators/newrepository/first")
getAndroidCameraRepositoryR :: Handler ()
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"]
{- Adding a new local repository, which may be entirely separate, or may
- be connected to the current repository. -}
getNewRepositoryR :: Handler Html
2013-03-16 22:48:23 +00:00
getNewRepositoryR = postNewRepositoryR
postNewRepositoryR :: Handler Html
2013-03-16 22:48:23 +00:00
postNewRepositoryR = page "Add another repository" (Just Configuration) $ do
home <- liftIO myHomeDir
((res, form), enctype) <- liftH $ runFormPostNoToken $ newRepositoryForm home
case res of
FormSuccess (RepositoryPath p) -> do
let path = T.unpack p
isnew <- liftIO $ makeRepo path False
u <- liftIO $ initRepo isnew True path Nothing (Just ClientGroup)
liftIO $ addAutoStartFile path
liftIO $ startAssistant path
askcombine u path
_ -> $(widgetFile "configurators/newrepository")
where
askcombine newrepouuid newrepopath = do
newrepo <- liftIO $ relHome newrepopath
mainrepo <- fromJust . relDir <$> liftH getYesod
$(widgetFile "configurators/newrepository/combine")
{- Ensure that a remote's description, group, etc are available by
- immediately pulling from it. Also spawns a sync to push to it as well. -}
immediateSyncRemote :: Remote -> Assistant ()
immediateSyncRemote r = do
currentbranch <- liftAnnex $ join Command.Sync.getCurrBranch
void $ manualPull currentbranch [r]
syncRemote r
2013-09-27 04:31:12 +00:00
getCombineRepositoryR :: FilePath -> UUID -> Handler Html
getCombineRepositoryR newrepopath newrepouuid = do
liftAssistant . immediateSyncRemote =<< combineRepos newrepopath remotename
redirect $ EditRepositoryR $ RepoUUID newrepouuid
where
remotename = takeFileName newrepopath
2012-08-31 19:17:12 +00:00
selectDriveForm :: [RemovableDrive] -> Hamlet.Html -> MkMForm RemovableDrive
2014-04-18 00:07:09 +00:00
selectDriveForm drives = renderBootstrap3 bootstrapFormLayout $ RemovableDrive
2012-08-31 19:17:12 +00:00
<$> pure Nothing
2014-04-18 00:07:09 +00:00
<*> areq (selectFieldList pairs `withNote` onlywritable) (bfs "Select drive:") Nothing
<*> areq textField (bfs "Use this directory on the drive:")
2013-03-20 20:46:35 +00:00
(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)"
]
onlywritable = [whamlet|This list only includes drives you can write to.|]
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. -}
getAddDriveR :: Handler Html
2013-03-16 22:48:23 +00:00
getAddDriveR = postAddDriveR
postAddDriveR :: Handler Html
2013-03-16 22:48:23 +00:00
postAddDriveR = page "Add a removable drive" (Just Configuration) $ do
2013-10-02 04:42:27 +00:00
removabledrives <- liftIO driveList
2012-08-31 19:17:12 +00:00
writabledrives <- liftIO $
filterM (canWrite . T.unpack . mountPoint) removabledrives
((res, form), enctype) <- liftH $ runFormPostNoToken $
2013-03-20 20:46:35 +00:00
selectDriveForm (sort writabledrives)
2012-08-31 19:17:12 +00:00
case res of
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,
- the user must confirm the repository merge.
-
- If the repo does not already exist on the drive, prompt about
- encryption. -}
getConfirmAddDriveR :: RemovableDrive -> Handler Html
getConfirmAddDriveR drive = ifM (liftIO $ probeRepoExists dir)
( do
mu <- liftIO $ probeUUID dir
case mu of
Nothing -> maybe askcombine isknownuuid
=<< liftAnnex (probeGCryptRemoteUUID dir)
Just driveuuid -> isknownuuid driveuuid
, newrepo
)
2013-03-20 20:46:35 +00:00
where
dir = removableDriveRepository drive
newrepo = do
cmd <- liftAnnex $ gpgCmd <$> Annex.getGitConfig
secretkeys <- sortBy (comparing snd) . M.toList
<$> liftIO (secretKeys cmd)
page "Encrypt repository?" (Just Configuration) $
$(widgetFile "configurators/adddrive/encrypt")
knownrepo = getFinishAddDriveR drive NoRepoKey
askcombine = page "Combine repositories?" (Just Configuration) $
$(widgetFile "configurators/adddrive/combine")
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
getGenKeyForDriveR :: RemovableDrive -> Handler Html
2013-10-02 04:42:27 +00:00
getGenKeyForDriveR drive = withNewSecretKey $ \keyid ->
{- 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)
( getFinishAddDriveR drive (RepoKey keyid)
, getAddDriveR
)
getFinishAddDriveR :: RemovableDrive -> RepoKey -> Handler Html
getFinishAddDriveR drive = go
2012-10-31 06:34:03 +00:00
where
2013-09-26 16:40:19 +00:00
go (RepoKey keyid) = whenGcryptInstalled $ makewith $ const $ do
r <- liftAnnex $ addRemote $
makeGCryptRemote remotename dir keyid
2013-09-26 16:40:19 +00:00
return (Types.Remote.uuid r, r)
go NoRepoKey = checkGCryptRepoEncryption dir makeunencrypted makeunencrypted $ do
mu <- liftAnnex $ probeGCryptRemoteUUID dir
case mu of
Just u -> enableexistinggcryptremote u
Nothing -> giveup "The drive contains a gcrypt repository that is not a git-annex special remote. This is not supported."
enableexistinggcryptremote u = do
remotename' <- liftAnnex $ getGCryptRemoteName u dir
makewith $ const $ do
r <- liftAnnex $ addRemote $
enableSpecialRemote remotename' GCrypt.remote Nothing $ 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) Nothing)
<*> combineRepos dir remotename
makewith a = do
liftIO $ createDirectoryIfMissing True dir
isnew <- liftIO $ makeRepo dir True
{- 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)
(u, r) <- a isnew
when isnew $
liftAnnex $ defaultStandardGroup u TransferGroup
liftAssistant $ immediateSyncRemote r
redirect $ EditNewRepositoryR u
mountpoint = T.unpack (mountPoint drive)
2013-03-20 20:46:35 +00:00
dir = removableDriveRepository drive
remotename = takeFileName mountpoint
{- Each repository is made a remote of the other.
- Next call syncRemote to get them in sync. -}
combineRepos :: FilePath -> String -> Handler Remote
combineRepos dir name = liftAnnex $ do
2013-10-02 04:42:27 +00:00
hostname <- fromMaybe "host" <$> liftIO getHostname
mylocation <- fromRepo Git.repoLocation
mypath <- liftIO $ relPathDirToFile dir mylocation
liftIO $ inDir dir $ void $ makeGitRemote hostname mypath
addRemote $ makeGitRemote name dir
getEnableDirectoryR :: UUID -> Handler Html
getEnableDirectoryR uuid = page "Enable a repository" (Just Configuration) $ do
description <- liftAnnex $ T.pack <$> prettyUUID uuid
$(widgetFile "configurators/enabledirectory")
2012-08-31 19:17:12 +00:00
{- List of removable drives. -}
driveList :: IO [RemovableDrive]
2013-12-09 20:56:52 +00:00
#ifdef mingw32_HOST_OS
2013-12-09 20:59:16 +00:00
-- Just enumerate all likely drive letters for Windows.
-- Could use wmic, but it only works for administrators.
2013-12-10 05:18:04 +00:00
driveList = mapM (\d -> genRemovableDrive $ d:":\\") ['A'..'Z']
2013-12-09 20:56:52 +00:00
#else
2013-12-10 05:18:04 +00:00
driveList = mapM (genRemovableDrive . mnt_dir) =<< filter sane <$> getMounts
2012-10-31 06:34:03 +00:00
where
-- 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
#ifdef __ANDROID__
| dir == "/mnt/sdcard" = False
| dir == "/sdcard" = False
#endif
2012-10-31 06:34:03 +00:00
| otherwise = True
2013-12-09 20:56:52 +00:00
#endif
2012-08-31 19:17:12 +00:00
2013-12-10 05:18:04 +00:00
genRemovableDrive :: FilePath -> IO RemovableDrive
genRemovableDrive dir = RemovableDrive
<$> getDiskFree dir
<*> pure (T.pack dir)
<*> pure (T.pack gitAnnexAssistantDefaultDir)
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. -}
startFullAssistant :: FilePath -> StandardGroup -> Maybe (Annex ())-> Handler ()
startFullAssistant path repogroup setup = do
2012-08-31 19:17:12 +00:00
webapp <- getYesod
url <- liftIO $ do
isnew <- makeRepo path False
void $ initRepo isnew True path Nothing (Just repogroup)
inDir path $ fromMaybe noop setup
addAutoStartFile path
setCurrentDirectory path
2012-08-31 19:17:12 +00:00
fromJust $ postFirstRun webapp
redirect $ T.pack url
{- 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)
2012-08-31 19:17:12 +00:00
catchBoolIO $ fileAccess tocheck False True False
{- 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