summaryrefslogtreecommitdiffstats
path: root/XMonad/Operations.hs
diff options
context:
space:
mode:
authorSpencer Janssen <sjanssen@cse.unl.edu>2008-03-25 10:15:26 +0100
committerSpencer Janssen <sjanssen@cse.unl.edu>2008-03-25 10:15:26 +0100
commitda3761c4919a4a3268b52ffb05331aaca304831c (patch)
tree5f72beed4d71df149799772781bc5cb4aae92a8b /XMonad/Operations.hs
parentb1827aa25f5cde0127598fa4bfc3e522b83741c5 (diff)
downloadmetatile-da3761c4919a4a3268b52ffb05331aaca304831c.tar
metatile-da3761c4919a4a3268b52ffb05331aaca304831c.zip
Remove gaps
darcs-hash:20080325091526-a5988-e6ed58b0d493845525a4c7e5977352cfb12b9c92
Diffstat (limited to 'XMonad/Operations.hs')
-rw-r--r--XMonad/Operations.hs18
1 files changed, 2 insertions, 16 deletions
diff --git a/XMonad/Operations.hs b/XMonad/Operations.hs
index 56e04bb..7daf309 100644
--- a/XMonad/Operations.hs
+++ b/XMonad/Operations.hs
@@ -77,15 +77,6 @@ manage w = whenX (not <$> isClient w) $ withDisplay $ \d -> do
unmanage :: Window -> X ()
unmanage = windows . W.delete
--- | Modify the size of the status gap at the top of the current screen
--- Taking a function giving the current screen, and current geometry.
-modifyGap :: (Int -> (Int,Int,Int,Int) -> (Int,Int,Int,Int)) -> X ()
-modifyGap f = do
- windows $ \ws@(W.StackSet { W.current = c@(W.Screen { W.screenDetail = sd }) }) ->
- let n = fromIntegral . W.screen $ c
- g = f n . statusGap $ sd
- in ws { W.current = c { W.screenDetail = sd { statusGap = g } } }
-
-- | Kill the currently focused client. If we do kill it, we'll get a
-- delete notify back from X.
--
@@ -136,10 +127,7 @@ windows f = do
tiled = (W.stack . W.workspace . W.current $ this)
>>= W.filter (`M.notMember` W.floating ws)
>>= W.filter (`notElem` vis)
- (SD (Rectangle sx sy sw sh)
- (gt,gb,gl,gr)) = W.screenDetail w
- viewrect = Rectangle (sx + fromIntegral gl) (sy + fromIntegral gt)
- (sw - fromIntegral (gl + gr)) (sh - fromIntegral (gt + gb))
+ viewrect@(Rectangle sx sy sw sh) = screenRect $ W.screenDetail w
-- just the tiled windows:
-- now tile the windows on this workspace, modified by the gap
@@ -276,9 +264,7 @@ rescreen = do
windows $ \ws@(W.StackSet { W.current = v, W.visible = vs, W.hidden = hs }) ->
let (xs, ys) = splitAt (length xinesc) $ map W.workspace (v:vs) ++ hs
- (a:as) = zipWith3 W.Screen xs [0..] $ zipWith SD xinesc gs
- sgs = map (statusGap . W.screenDetail) (v:vs)
- gs = take (length xinesc) (sgs ++ repeat (0,0,0,0))
+ (a:as) = zipWith3 W.Screen xs [0..] $ map SD xinesc
in ws { W.current = a
, W.visible = as
, W.hidden = ys }