65 lines
1.8 KiB
Haskell
65 lines
1.8 KiB
Haskell
--------------------------------------------------------------------------------
|
|
-- Functions for formatting and sending notifications
|
|
--
|
|
-- NOTE I use the DBus.Notify lib even though I don't actually use the DBus for
|
|
-- notifications (just formation them into 'notify-send' commands and spawn a
|
|
-- shell since that works more consistently with my current commands). If I ever
|
|
-- decide to switch to using the DBus it will be easy.
|
|
|
|
module XMonad.Internal.Notify
|
|
( Note (..)
|
|
, Body (..)
|
|
, defNote
|
|
, defNoteInfo
|
|
, defNoteError
|
|
, fmtNotifyCmd
|
|
, spawnNotify
|
|
)
|
|
where
|
|
|
|
import DBus.Notify
|
|
import RIO
|
|
import qualified RIO.Text as T
|
|
import XMonad.Internal.Shell
|
|
|
|
--------------------------------------------------------------------------------
|
|
-- Some nice default notes
|
|
|
|
defNote :: Note
|
|
defNote = blankNote {summary = "\"xmonad\""}
|
|
|
|
defNoteInfo :: Note
|
|
defNoteInfo =
|
|
defNote
|
|
{ appImage = Just $ Icon "dialog-information-symbolic"
|
|
}
|
|
|
|
defNoteError :: Note
|
|
defNoteError =
|
|
defNote
|
|
{ appImage = Just $ Icon "dialog-error-symbolic"
|
|
}
|
|
|
|
--------------------------------------------------------------------------------
|
|
-- Format a 'notify-send' command to be send to the shell
|
|
|
|
parseBody :: Body -> Maybe T.Text
|
|
parseBody (Text s) = Just $ T.pack s
|
|
parseBody _ = Nothing
|
|
|
|
fmtNotifyCmd :: Note -> T.Text
|
|
fmtNotifyCmd = fmtCmd "notify-send" . fmtNotifyArgs
|
|
|
|
spawnNotify :: MonadIO m => Note -> m ()
|
|
spawnNotify = spawnCmd "notify-send" . fmtNotifyArgs
|
|
|
|
fmtNotifyArgs :: Note -> [T.Text]
|
|
fmtNotifyArgs n = getIcon n ++ getSummary n ++ getBody n
|
|
where
|
|
-- TODO add the rest of the options as needed
|
|
getSummary = (: []) . doubleQuote . T.pack . summary
|
|
getIcon n' =
|
|
maybe [] (\i -> ["-i", T.pack $ case i of Icon s -> s; File s -> s]) $
|
|
appImage n'
|
|
getBody n' = maybeToList $ (fmap doubleQuote . parseBody) =<< body n'
|