aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Util/Dzen.hs
diff options
context:
space:
mode:
authorDevin Mullins <me@twifkak.com>2007-11-11 00:11:15 +0100
committerDevin Mullins <me@twifkak.com>2007-11-11 00:11:15 +0100
commit139d184d287dc11a8788483d345407d8403a2fc2 (patch)
tree6c5ca7b4f83ae121d45482b13b443c458e96b7ba /XMonad/Util/Dzen.hs
parente187864be806c0aa733e99d661fa41e953dd3525 (diff)
downloadXMonadContrib-139d184d287dc11a8788483d345407d8403a2fc2.tar.gz
XMonadContrib-139d184d287dc11a8788483d345407d8403a2fc2.tar.xz
XMonadContrib-139d184d287dc11a8788483d345407d8403a2fc2.zip
remove dzenUrgencyHook* from Dzen module
To be replaced by UrgencyHook instances defined in the UrgencyHook module. darcs-hash:20071110231115-78224-7a927fcd9a00f9bef4230ea59b99af7334df0d52.gz
Diffstat (limited to 'XMonad/Util/Dzen.hs')
-rw-r--r--XMonad/Util/Dzen.hs31
1 files changed, 1 insertions, 30 deletions
diff --git a/XMonad/Util/Dzen.hs b/XMonad/Util/Dzen.hs
index 2a63942..35a79d7 100644
--- a/XMonad/Util/Dzen.hs
+++ b/XMonad/Util/Dzen.hs
@@ -13,18 +13,9 @@
-----------------------------------------------------------------------------
module XMonad.Util.Dzen (dzen, dzenWithArgs, dzenScreen,
- dzenUrgencyHook, dzenUrgencyHookWithArgs,
- seconds) where
+ seconds) where
-import Control.Monad (when)
-import Control.Monad.State (gets)
-import qualified Data.Set as S
-import Graphics.X11.Types (Window)
-
-import qualified XMonad.StackSet as W
import XMonad
-
-import XMonad.Util.NamedWindows (getName)
import XMonad.Util.Run (runProcessWithInputAndWait, seconds)
-- | @dzen str timeout@ pipes @str@ to dzen2 for @timeout@ microseconds.
@@ -51,23 +42,3 @@ dzenScreen :: ScreenId -> String -> Int -> X()
dzenScreen sc str timeout = dzenWithArgs str ["-xs", screen] timeout
where screen = toXineramaArg sc
toXineramaArg n = show ( ((fromIntegral n)+1)::Int )
-
--- | Flashes when a window requests your attention and you can't see it. For use with
--- XMonad.Hooks.UrgencyHook. Usage:
--- > urgencyHook = dzenUrgencyHook (5 `seconds`)
-dzenUrgencyHook :: Int -> Window -> X ()
-dzenUrgencyHook = dzenUrgencyHookWithArgs []
-
--- | Flashes when a window requests your attention and you can't see it. For use with
--- XMonad.Hooks.UrgencyHook. Usage:
--- > urgencyHook = dzenUrgencyHookWithArgs ["-bg", "darkgreen"] (5 `seconds`)
-dzenUrgencyHookWithArgs :: [String] -> Int -> Window -> X ()
-dzenUrgencyHookWithArgs args duration w = do
- visibles <- gets mapped
- name <- getName w
- ws <- gets windowset
- whenJust (W.findTag w ws) (flash name visibles)
- where flash name visibles index =
- when (not $ S.member w visibles) $
- dzenWithArgs (show name ++ " requests your attention on workspace " ++ index)
- args duration