git-annex/Assistant/Alert.hs

270 lines
8.2 KiB
Haskell
Raw Normal View History

2012-07-29 13:35:01 +00:00
{- git-annex assistant alerts
-
- Copyright 2012 Joey Hess <joey@kitenet.net>
-
- Licensed under the GNU GPL version 3 or higher.
-}
{-# LANGUAGE RankNTypes #-}
module Assistant.Alert where
import Common.Annex
import qualified Remote
2012-07-30 16:21:53 +00:00
import qualified Data.Map as M
2012-07-29 13:35:01 +00:00
import Yesod
type Widget = forall sub master. GWidget sub master ()
{- Different classes of alerts are displayed differently. -}
2012-07-29 23:05:51 +00:00
data AlertClass = Success | Message | Activity | Warning | Error
deriving (Eq, Ord)
2012-07-29 13:35:01 +00:00
2012-07-30 16:21:53 +00:00
data AlertPriority = Filler | Low | Medium | High | Pinned
deriving (Eq, Ord)
{- An alert can be a simple message, or an arbitrary Yesod Widget. -}
data AlertMessage = StringAlert String | WidgetAlert (Alert -> Widget)
2012-07-29 13:35:01 +00:00
{- An alert can have an name, which is used to combine it with other similar
- alerts. -}
data AlertName = AddFileAlert | DownloadFailedAlert | SanityCheckFixAlert
deriving (Eq)
{- The first alert is the new alert, the second is an old alert.
- Should return a modified version of the old alert. -}
type AlertCombiner = Maybe (Alert -> Alert -> Maybe Alert)
2012-07-29 13:35:01 +00:00
data Alert = Alert
{ alertClass :: AlertClass
, alertHeader :: Maybe String
2012-07-29 13:35:01 +00:00
, alertMessage :: AlertMessage
, alertBlockDisplay :: Bool
, alertClosable :: Bool
2012-07-29 23:05:51 +00:00
, alertPriority :: AlertPriority
2012-07-31 07:10:16 +00:00
, alertIcon :: Maybe String
, alertCombiner :: AlertCombiner
, alertName :: Maybe AlertName
}
type AlertPair = (AlertId, Alert)
type AlertMap = M.Map AlertId Alert
2012-07-29 23:05:51 +00:00
{- Higher AlertId indicates a more recent alert. -}
newtype AlertId = AlertId Integer
deriving (Read, Show, Eq, Ord)
{- Note: This first alert id is used for yesod's message. -}
firstAlertId :: AlertId
firstAlertId = AlertId 0
nextAlertId :: AlertId -> AlertId
nextAlertId (AlertId i) = AlertId $ succ i
2012-07-29 23:05:51 +00:00
2012-07-30 16:21:53 +00:00
{- This is as many alerts as it makes sense to display at a time.
- A display might be smaller ,or larger, the point is to not overwhelm the
- user with a ton of alerts. -}
displayAlerts :: Int
displayAlerts = 6
2012-07-30 16:21:53 +00:00
{- This is not a hard maximum, but there's no point in keeping a great
- many filler alerts in an AlertMap, so when there's more than this many,
- they start being pruned, down toward displayAlerts. -}
maxAlerts :: Int
maxAlerts = displayAlerts * 2
2012-07-29 23:05:51 +00:00
{- The desired order is the reverse of:
-
- - Pinned alerts
2012-07-29 23:05:51 +00:00
- - High priority alerts, newest first
- - Medium priority Activity, newest first (mostly used for Activity)
- - Low priority alerts, newest first
- - Filler priorty alerts, newest first
2012-07-29 23:05:51 +00:00
- - Ties are broken by the AlertClass, with Errors etc coming first.
-}
compareAlertPairs :: AlertPair -> AlertPair -> Ordering
compareAlertPairs
(aid, Alert { alertClass = aclass, alertPriority = aprio })
(bid, Alert { alertClass = bclass, alertPriority = bprio })
2012-07-29 23:05:51 +00:00
= compare aprio bprio
`thenOrd` compare aid bid
`thenOrd` compare aclass bclass
2012-07-30 16:21:53 +00:00
sortAlertPairs :: [AlertPair] -> [AlertPair]
sortAlertPairs = sortBy compareAlertPairs
{- Checks if two alerts display the same.
- Yesod Widgets cannot be compared, as they run code. -}
effectivelySameAlert :: Alert -> Alert -> Bool
effectivelySameAlert x y
| uncomparable x || uncomparable y = False
| otherwise = all id
[ alertClass x == alertClass y
, alertHeader x == alertHeader y
, extract (alertMessage x) == extract (alertMessage y)
, alertBlockDisplay x == alertBlockDisplay y
, alertClosable x == alertClosable y
, alertPriority x == alertPriority y
]
where
uncomparable (Alert { alertMessage = StringAlert _ }) = False
uncomparable _ = True
extract (StringAlert s) = s
extract _ = ""
makeAlertFiller :: Bool -> Alert -> Alert
makeAlertFiller success alert
2012-07-30 16:21:53 +00:00
| isFiller alert = alert
| otherwise = alert
{ alertClass = if c == Activity then c' else c
, alertPriority = Filler
2012-07-30 16:23:40 +00:00
, alertClosable = True
2012-07-31 07:10:16 +00:00
, alertIcon = Just $ if success then "ok" else "exclamation-sign"
}
where
c = alertClass alert
c'
| success = Success
| otherwise = Error
2012-07-30 16:21:53 +00:00
isFiller :: Alert -> Bool
isFiller alert = alertPriority alert == Filler
{- Converts a given alert into filler, manipulating it in the AlertMap.
-
- Any old filler that looks the same as the reference alert is removed,
- or, if the input alert has an alertCombine that combines it with
- old filler, the old filler is replaced with the result, and the
- input alert is removed.
2012-07-30 16:21:53 +00:00
-
- Old filler alerts are pruned once maxAlerts is reached.
-}
convertToFiller :: AlertId -> Bool -> AlertMap -> AlertMap
convertToFiller i success m = case M.lookup i m of
Nothing -> m
Just al ->
let al' = makeAlertFiller success al
in case alertCombiner al' of
Nothing -> updatePrune al'
Just combiner -> updateCombine combiner al'
2012-07-30 16:21:53 +00:00
where
pruneSame ref k al = k == i || not (effectivelySameAlert ref al)
pruneBloat m'
| bloat > 0 = M.fromList $ pruneold $ M.toList m'
| otherwise = m'
where
bloat = M.size m' - maxAlerts
pruneold l =
let (f, rest) = partition (\(_, al) -> isFiller al) l
in drop bloat f ++ rest
updatePrune al = pruneBloat $ M.filterWithKey (pruneSame al) $
M.insertWith' const i al m
updateCombine combiner al =
let combined = M.mapMaybe (combiner al) m
in if M.null combined
then updatePrune al
else M.delete i $ M.union combined m
2012-07-29 23:05:51 +00:00
baseActivityAlert :: Alert
baseActivityAlert = Alert
{ alertClass = Activity
, alertHeader = Nothing
, alertMessage = StringAlert ""
, alertBlockDisplay = False
, alertClosable = False
2012-07-29 23:05:51 +00:00
, alertPriority = Medium
2012-07-31 07:10:16 +00:00
, alertIcon = Just "refresh"
, alertCombiner = Nothing
, alertName = Nothing
2012-07-29 13:35:01 +00:00
}
activityAlert :: Maybe String -> String -> Alert
activityAlert header message = baseActivityAlert
{ alertHeader = header
, alertMessage = StringAlert message
}
startupScanAlert :: Alert
startupScanAlert = activityAlert Nothing "Performing startup scan"
pushAlert :: [Remote] -> Alert
pushAlert rs = activityAlert Nothing $
"Syncing with " ++ unwords (map Remote.name rs)
pushRetryAlert :: [Remote] -> Alert
pushRetryAlert rs = activityAlert (Just "Retrying sync") $
"with " ++ unwords (map Remote.name rs) ++ ", which failed earlier."
syncMountAlert :: FilePath -> [Remote] -> Alert
syncMountAlert dir rs = baseActivityAlert
{ alertHeader = Just $ "Syncing with " ++ unwords (map Remote.name rs)
, alertMessage = StringAlert $ unwords
2012-07-30 02:18:58 +00:00
["You plugged in"
, dir
, " -- let's get it in sync!"
]
, alertBlockDisplay = True
2012-07-29 23:05:51 +00:00
, alertPriority = Low
}
scanAlert :: Remote -> Alert
scanAlert r = baseActivityAlert
{ alertHeader = Just $ "Scanning " ++ Remote.name r
, alertMessage = StringAlert $ unwords
[ "Ensuring that ", Remote.name r
, "is fully in sync." ]
, alertBlockDisplay = True
2012-07-29 23:05:51 +00:00
, alertPriority = Low
}
sanityCheckAlert :: Alert
sanityCheckAlert = activityAlert (Just "Running daily sanity check")
2012-07-30 02:18:58 +00:00
"to make sure everything is ok."
sanityCheckFixAlert :: String -> Alert
sanityCheckFixAlert msg = Alert
{ alertClass = Warning
, alertHeader = Just "Fixed a problem"
, alertMessage = StringAlert $ unlines [ alerthead, msg, alertfoot ]
, alertBlockDisplay = True
2012-07-29 23:05:51 +00:00
, alertPriority = High
, alertClosable = True
2012-07-31 07:10:16 +00:00
, alertIcon = Just "exclamation-sign"
, alertName = Just SanityCheckFixAlert
, alertCombiner = messageCombiner combinemessage
}
where
alerthead = "The daily sanity check found and fixed a problem:"
alertfoot = "If these problems persist, consider filing a bug report."
combinemessage (StringAlert new) (StringAlert old) =
let newmsg = filter (/= alerthead) $
filter (/= alertfoot) $
lines old ++ lines new
in Just $ StringAlert $
unlines $ alerthead : newmsg ++ [alertfoot]
combinemessage _ _ = Nothing
addFileAlert :: FilePath -> Alert
addFileAlert file = (activityAlert (Just "Added") $ takeFileName file)
{ alertName = Just AddFileAlert
, alertCombiner = messageCombiner combinemessage
}
where
combinemessage (StringAlert new) (StringAlert old) =
Just $ StringAlert $
unlines $ take 10 $ new : lines old
combinemessage _ _ = Nothing
messageCombiner :: (AlertMessage -> AlertMessage -> Maybe AlertMessage) -> AlertCombiner
messageCombiner combinemessage = Just go
where
go new old
| alertClass new /= alertClass old = Nothing
| alertName new == alertName old =
case combinemessage (alertMessage new) (alertMessage old) of
Nothing -> Nothing
Just m -> Just $ old { alertMessage = m }
| otherwise = Nothing