summaryrefslogtreecommitdiffhomepage
path: root/src/Xmobar/Plugins/Locks.hs
blob: 35a3f97e54c47e1a5849a36f0ceca3c6e3a92f3f (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
{-# LANGUAGE TupleSections #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  Plugins.Locks
-- Copyright   :  (c) Patrick Chilton
-- License     :  BSD-style (see LICENSE)
--
-- Maintainer  :  Patrick Chilton <chpatrick@gmail.com>
-- Stability   :  unstable
-- Portability :  unportable
--
-- A plugin that displays the status of the lock keys.
--
-----------------------------------------------------------------------------

module Xmobar.Plugins.Locks(Locks(..)) where

import Graphics.X11
import Data.List
import Data.List.Extra (trim)
import Data.Bits
import Data.Maybe  (fromJust)
import Control.Monad
import Control.Monad.Extra (ifM)
import Graphics.X11.Xlib.Extras
import Xmobar.Run.Exec
import Xmobar.System.Kbd
import Xmobar.X11.Events (nextEvent')

data Locks = Locks | Locks' [(String, (String, String))]
    deriving (Read, Show)

locks :: [ ( KeySym, String )]
locks = [ ( xK_Caps_Lock,   "CAPS" )
        , ( xK_Num_Lock,    "NUM" )
        , ( xK_Scroll_Lock, "SCROLL" )
        ]

type Labels = [ ( String, (String, String) )]
defaultLabels :: Labels
defaultLabels = let nms = map snd locks
                in zip nms (map (, mempty) nms)

type LabelledLock = (KeySym, String, String, String)

attach :: (KeySym, String) -> Labels -> LabelledLock
(key, lock) `attach` lbls = let (enb, dis) = fromJust $ lookup lock lbls
                            in (key, lock, enb, dis)

enabled :: (a, b, c, d) -> c
enabled (_, _, c, _) = c
disabled :: (a, b, c, d) -> d
disabled (_, _, _, d) = d

isEnabled :: (Bits a1, Foldable t, Foldable t1, Integral a)
  => Display -> t (a, t1 KeyCode) -> a1 -> (KeySym, b, c, d) -> IO Bool
isEnabled d modMap m ( ks, _, _, _ ) = do
    kc <- keysymToKeycode d ks
    return $ case find (elem kc . snd) modMap of
        Nothing       -> False
        Just ( i, _ ) -> testBit m (fromIntegral i)

run' :: Display -> Window -> Labels -> IO String
run' d root labels = do
    modMap <- getModifierMapping d
    ( _, _, _, _, _, _, _, m ) <- queryPointer d root

    ls' <- forM (map (`attach` labels) locks)
                (\l -> ifM (isEnabled d modMap m l)
                           (return (enabled l))
                           (return (disabled l)))
    return $ trim $ unwords ls'

instance Exec Locks where
    alias _ = "locks"
    start Locks cb = start (Locks' defaultLabels) cb
    start (Locks' labels) cb = do
        d <- openDisplay ""
        root <- rootWindow d (defaultScreen d)
        _ <- xkbSelectEventDetails d xkbUseCoreKbd xkbIndicatorStateNotify m m

        allocaXEvent $ \ep -> forever $ do
            cb =<< run' d root labels
            nextEvent' d ep
            getEvent ep

        closeDisplay d
        return ()
      where
        m = xkbAllStateComponentsMask