2012-07-31 05:11:32 +00:00
|
|
|
{- git-annex assistant webapp configurators
|
|
|
|
-
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
|
|
|
{-# LANGUAGE TypeFamilies, QuasiQuotes, MultiParamTypeClasses, TemplateHaskell, OverloadedStrings, RankNTypes #-}
|
|
|
|
|
|
|
|
module Assistant.WebApp.Configurators where
|
|
|
|
|
|
|
|
import Assistant.Common
|
|
|
|
import Assistant.WebApp
|
|
|
|
import Assistant.WebApp.SideBar
|
|
|
|
import Assistant.ThreadedMonad
|
|
|
|
import Utility.Yesod
|
|
|
|
import qualified Remote
|
|
|
|
import Logs.Web (webUUID)
|
|
|
|
import Logs.Trust
|
|
|
|
import Annex.UUID (getUUID)
|
|
|
|
|
|
|
|
import Yesod
|
|
|
|
import Data.Text (Text)
|
|
|
|
|
|
|
|
{- An intro message, list of repositories, and nudge to make more. -}
|
|
|
|
introDisplay :: Text -> Widget
|
|
|
|
introDisplay ident = do
|
|
|
|
webapp <- lift getYesod
|
|
|
|
let reldir = relDir webapp
|
|
|
|
l <- liftIO $ runThreadState (threadState webapp) $ do
|
|
|
|
u <- getUUID
|
|
|
|
rs <- map Remote.uuid <$> Remote.remoteList
|
|
|
|
rs' <- snd <$> trustPartition DeadTrusted rs
|
|
|
|
Remote.prettyListUUIDs $ filter (/= webUUID) $ nub $ u:rs'
|
|
|
|
let remotelist = zip counter l
|
|
|
|
let n = length l
|
|
|
|
let numrepos = show n
|
|
|
|
let notenough = n < 2
|
|
|
|
let barelyenough = n == 2
|
|
|
|
let morethanenough = n > 2
|
2012-07-31 05:24:49 +00:00
|
|
|
$(widgetFile "configurators/intro")
|
2012-07-31 05:11:32 +00:00
|
|
|
lift $ modifyWebAppState $ \s -> s { showIntro = False }
|
|
|
|
where
|
|
|
|
counter = map show ([1..] :: [Int])
|
|
|
|
|
|
|
|
getConfigR :: Handler RepHtml
|
2012-07-31 06:30:26 +00:00
|
|
|
getConfigR = bootstrap (Just Config) $ do
|
2012-07-31 05:11:32 +00:00
|
|
|
sideBarDisplay
|
|
|
|
setTitle "Configuration"
|
2012-07-31 06:30:26 +00:00
|
|
|
$(widgetFile "configurators/main")
|
2012-07-31 05:11:32 +00:00
|
|
|
|
|
|
|
getAddRepositoryR :: Handler RepHtml
|
2012-07-31 06:30:26 +00:00
|
|
|
getAddRepositoryR = bootstrap (Just Config) $ do
|
2012-07-31 05:11:32 +00:00
|
|
|
sideBarDisplay
|
|
|
|
setTitle "Add repository"
|
2012-07-31 06:35:01 +00:00
|
|
|
$(widgetFile "configurators/addrepository")
|