summaryrefslogtreecommitdiffhomepage
path: root/src/Xmobar/Plugins/NotmuchMail.hs
blob: 3da170cfb3e835382ab231b9cb045fa95aa23ec4 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
{-# LANGUAGE InstanceSigs        #-}
{-# LANGUAGE NamedFieldPuns      #-}
{-# LANGUAGE ScopedTypeVariables #-}

-----------------------------------------------------------------------------
-- |
-- Module      :  Xmobar.Plugins.NotmuchMail
-- Copyright   :  (c) slotThe
-- License     :  BSD-style (see LICENSE)
--
-- Maintainer  :  slotThe <soliditsallgood@mailbox.org>
-- Stability   :  unstable
-- Portability :  unportable
--
-- This plugin checks for new mail, provided that this mail is indexed
-- by @notmuch@.  You can think of it as a thin wrapper around the
-- functionality provided by @notmuch search@.
--
-- As mail that was tagged is moved from the @new@ directory to @cur@,
-- the @inotify@ solution that he mail 'Mail' plugin (and its variants)
-- uses won't work for such mail.  Hence, we have to resort to a
-- refresh-based monitor.
--
-- Note that, in the `notmuch` spirit, this plugin checks for new
-- threads and not new individual messages.  For convenience, the
-- @unread@ tag is added before the user query (compose via an @and@).
--
-----------------------------------------------------------------------------

module Xmobar.Plugins.NotmuchMail
  ( -- * Types
    MailItem(..)     -- instances: Read, Show
  , NotmuchMail(..)  -- instances: Read, Show
  ) where

import Xmobar.Run.Exec (Exec(alias, rate, run))

import Control.Concurrent.Async (mapConcurrently)
import Data.Maybe (catMaybes)
import System.Exit (ExitCode(ExitSuccess))
import System.Process (readProcessWithExitCode)


-- | A 'MailItem' is a name, an address, and a query to give to @notmuch@.
data MailItem = MailItem
  { name    :: String  -- ^ Display name for the item in the bar
  , address :: String  -- ^ Only check for mail sent to this address; may be
                       --   the empty string to query all indexed mail instead
  , query   :: String  -- ^ Query to give to @notmuch search@
  }
  deriving (Read, Show)

-- | A full mail configuration.
data NotmuchMail = NotmuchMail
  { nmAlias   :: String      -- ^ Alias for the template string
  , mailItems :: [MailItem]  -- ^ 'MailItem's to check
  , nmRate    :: Int         -- ^ Update frequency (in deciseconds)
  }
  deriving (Read, Show)

-- | How to execute this plugin.
instance Exec NotmuchMail where
  -- | How often to update the plugin (in deciseconds).
  rate :: NotmuchMail -> Int
  rate NotmuchMail{ nmRate } = nmRate

  -- | How to alias the plugin in the template string.
  alias :: NotmuchMail -> String
  alias NotmuchMail{ nmAlias } = nmAlias

  -- | Run the plugin exactly once.
  run :: NotmuchMail -> IO String
  run NotmuchMail{ mailItems } =
    unwords . catMaybes <$> mapConcurrently notmuchSpawn mailItems
   where
    -- | Given a single 'MailItem', shell out to @notmuch@ and get the number
    -- of unread mails, then decide whether what we have is worth printing.
    notmuchSpawn :: MailItem -> IO (Maybe String)
      = \MailItem{ address, name, query } -> do
          -- Shell out to @notmuch@
          let args = [ "search"
                     , tryAdd "to:" address
                     , "tag:unread", tryAdd "and " query
                     ]
          (exitCode, out, _) <- readProcessWithExitCode "notmuch" args []

          -- Only print something when there is at least _some_ new mail
          let numThreads = length (lines out)
          pure $!
            (name <>) . show <$> if   exitCode /= ExitSuccess || numThreads < 1
                                 then Nothing
                                 else Just numThreads

    -- | Only add something to a 'String' if it's not empty.
    tryAdd :: String -> String -> String
      = \prefix str -> if null str then "" else prefix <> str