aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Actions/GroupNavigation.hs
diff options
context:
space:
mode:
authorAdam Vogt <vogt.adam@gmail.com>2012-11-09 02:41:56 +0100
committerAdam Vogt <vogt.adam@gmail.com>2012-11-09 02:41:56 +0100
commit3147065b3ff8d0cade905909aa29946378298f76 (patch)
tree7a3b0d4a08853e43b3ee95873466cefb2b48c567 /XMonad/Actions/GroupNavigation.hs
parent7f324e08476792e522987867c0f8098eeb0e50e0 (diff)
downloadXMonadContrib-3147065b3ff8d0cade905909aa29946378298f76.tar.gz
XMonadContrib-3147065b3ff8d0cade905909aa29946378298f76.tar.xz
XMonadContrib-3147065b3ff8d0cade905909aa29946378298f76.zip
Remove trailing whitespace.
Ignore-this: 72e3afb6e6df47c51262006601765365 darcs-hash:20121109014156-1499c-45797b245e25e966e4ca337ee224b593aaac63a0.gz
Diffstat (limited to '')
-rw-r--r--XMonad/Actions/GroupNavigation.hs16
1 files changed, 8 insertions, 8 deletions
diff --git a/XMonad/Actions/GroupNavigation.hs b/XMonad/Actions/GroupNavigation.hs
index 8a43cd2..639876b 100644
--- a/XMonad/Actions/GroupNavigation.hs
+++ b/XMonad/Actions/GroupNavigation.hs
@@ -20,7 +20,7 @@
--
----------------------------------------------------------------------
-module XMonad.Actions.GroupNavigation ( -- * Usage
+module XMonad.Actions.GroupNavigation ( -- * Usage
-- $usage
Direction (..)
, nextMatch
@@ -110,13 +110,13 @@ nextMatch dir qry = nextMatchOrDo dir qry (return ())
-- | Focuses the next window that matches the given boolean query. If
-- there is no such window, perform the given action instead.
nextMatchOrDo :: Direction -> Query Bool -> X () -> X ()
-nextMatchOrDo dir qry act = orderedWindowList dir
+nextMatchOrDo dir qry act = orderedWindowList dir
>>= focusNextMatchOrDo qry act
-- Produces the action to perform depending on whether there's a
-- matching window
focusNextMatchOrDo :: Query Bool -> X () -> Seq Window -> X ()
-focusNextMatchOrDo qry act = findM (runQuery qry)
+focusNextMatchOrDo qry act = findM (runQuery qry)
>=> maybe act (windows . SS.focusWindow)
-- Returns the list of windows ordered by workspace as specified in
@@ -126,7 +126,7 @@ orderedWindowList History = liftM (\(HistoryDB w ws) -> maybe ws (ws |>) w) XS.g
orderedWindowList dir = withWindowSet $ \ss -> do
wsids <- asks (Seq.fromList . workspaces . config)
let wspcs = orderedWorkspaceList ss wsids
- wins = dirfun dir
+ wins = dirfun dir
$ Fold.foldl' (><) Seq.empty
$ fmap (Seq.fromList . SS.integrate' . SS.stack) wspcs
cur = SS.peek ss
@@ -148,7 +148,7 @@ orderedWorkspaceList ss wsids = rotateTo isCurWS wspcs'
--- History navigation, requires a layout modifier -------------------
-- The state extension that holds the history information
-data HistoryDB = HistoryDB (Maybe Window) -- currently focused window
+data HistoryDB = HistoryDB (Maybe Window) -- currently focused window
(Seq Window) -- previously focused windows
deriving (Read, Show, Typeable)
@@ -182,12 +182,12 @@ flt :: (a -> Bool) -> Seq a -> Seq a
flt p = Fold.foldl (\xs x -> if p x then xs |> x else xs) Seq.empty
brkl :: (a -> Bool) -> Seq a -> (Seq a, Seq a)
-brkl p xs = flip Seq.splitAt xs
- $ snd
+brkl p xs = flip Seq.splitAt xs
+ $ snd
$ Fold.foldr (\x (i, j) -> if p x then (i-1, i-1) else (i-1, j)) (l, l) xs
where
l = Seq.length xs
-
+
--- Some sequence helpers --------------------------------------------
-- Rotates the sequence by one position