aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad
diff options
context:
space:
mode:
authorAdam Vogt <vogt.adam@gmail.com>2013-05-14 23:54:21 +0200
committerAdam Vogt <vogt.adam@gmail.com>2013-05-14 23:54:21 +0200
commit719c7b39dca9740474848f5157c88848a83c4d73 (patch)
tree8f160886a173acc36a195c032abf62a3b1d88654 /XMonad
parentdba80481b0ed8926c6b98fc20d0f8f31e71fc33d (diff)
downloadXMonadContrib-719c7b39dca9740474848f5157c88848a83c4d73.tar.gz
XMonadContrib-719c7b39dca9740474848f5157c88848a83c4d73.tar.xz
XMonadContrib-719c7b39dca9740474848f5157c88848a83c4d73.zip
Remove trailing whitespace in X.A.LinkWorkspaces
Ignore-this: 5015ab4468e7931876eb66b019af804c darcs-hash:20130514215421-1499c-ad6e69d79e7d8a2c8d0f80489f8291fa8687286d.gz
Diffstat (limited to 'XMonad')
-rw-r--r--XMonad/Actions/LinkWorkspaces.hs16
1 files changed, 8 insertions, 8 deletions
diff --git a/XMonad/Actions/LinkWorkspaces.hs b/XMonad/Actions/LinkWorkspaces.hs
index a3c0f7c..2163af3 100644
--- a/XMonad/Actions/LinkWorkspaces.hs
+++ b/XMonad/Actions/LinkWorkspaces.hs
@@ -26,7 +26,7 @@ module XMonad.Actions.LinkWorkspaces (
MessageConfig(..)
) where
-import XMonad
+import XMonad
import qualified XMonad.StackSet as W
import XMonad.Layout.IndependentScreens(countScreens)
import qualified XMonad.Util.ExtensibleState as XS (get, put)
@@ -38,7 +38,7 @@ import qualified Data.Map as M
-- You can use this module with the following in your @~\/.xmonad\/xmonad.hs@ file:
--
-- > import XMonad.Actions.LinkWorkspaces
---
+--
-- and add a function to print messages like
-- > message_command (S screen) = " dzen2 -p 1 -w 300 -xs " ++ show (screen + 1)
-- > message_color_func c1 c2 msg = dzenColor c1 c2 msg
@@ -53,7 +53,7 @@ import qualified Data.Map as M
--
-- > [ ((modm .|. m, k), a i)
-- > | (a, m) <- [(switchWS (\y -> windows $ view y) message, 0),(switchWS (\x -> windows $ shift x . view x) message, shiftMask)]
--- > , (i, k) <- zip [1..] [xK_1 .. xK_9]]
+-- > , (i, k) <- zip (XMonad.workspaces conf) [xK_1 .. xK_9]]
--
-- For detailed instructions on editing your key bindings, see
-- "XMonad.Doc.Extending#Editing_key_bindings".
@@ -63,7 +63,7 @@ data MessageConfig = MessageConfig { messageFunction :: (ScreenId -> [Char] ->
, alertedForeground :: [Char]
, background :: [Char]
}
-
+
defaultMessageConf :: MessageConfig
defaultMessageConf = MessageConfig { messageFunction = noMessageFn
, background = "#000000"
@@ -122,7 +122,7 @@ setMatching :: MessageConfig -> WorkspaceId -> WorkspaceId -> M.Map WorkspaceId
setMatching message t1 t2 matchings = do
ws <- gets windowset
let now = W.screen (W.current ws)
- XS.put $ WorkspaceMap $ M.insert t1 t2 matchings
+ XS.put $ WorkspaceMap $ M.insert t1 t2 matchings
messageFunction message now (foreground message) (background message) ("Linked: " ++ (t1 ++ " " ++ t2))
-- currently this function is called manually this means that if workspaces
@@ -133,7 +133,7 @@ removeMatching' :: MessageConfig -> WorkspaceId -> WorkspaceId -> M.Map Workspac
removeMatching' message t1 t2 matchings = do
ws <- gets windowset
let now = W.screen (W.current ws)
- XS.put $ WorkspaceMap $ M.delete t1 matchings
+ XS.put $ WorkspaceMap $ M.delete t1 matchings
messageFunction message now (alertedForeground message) (background message) ("Unlinked: " ++ t1 ++ " " ++ t2)
-- | Remove all maps between workspaces
@@ -146,8 +146,8 @@ removeAllMatchings message = do
-- | remove all matching regarding a given workspace
unMatch :: WorkspaceId -> X ()
-unMatch workspace = do
- WorkspaceMap matchings <- XS.get :: X WorkspaceMap
+unMatch workspace = do
+ WorkspaceMap matchings <- XS.get :: X WorkspaceMap
XS.put $ WorkspaceMap $ M.delete workspace (M.filter (/= workspace) matchings)
-- | Toggle the currently displayed workspaces as matching. Starting from the one with focus