aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Layout/Roledex.hs
diff options
context:
space:
mode:
authorAdam Vogt <vogt.adam@gmail.com>2009-07-05 22:12:05 +0200
committerAdam Vogt <vogt.adam@gmail.com>2009-07-05 22:12:05 +0200
commit595021f9a0b70483a7e26337bab8b2da68cd4757 (patch)
tree3800d5ee909f007a77205f5484a732d12a988675 /XMonad/Layout/Roledex.hs
parent29c6f55759fc8a080c7dddf7094ec0e3a896df39 (diff)
downloadXMonadContrib-595021f9a0b70483a7e26337bab8b2da68cd4757.tar.gz
XMonadContrib-595021f9a0b70483a7e26337bab8b2da68cd4757.tar.xz
XMonadContrib-595021f9a0b70483a7e26337bab8b2da68cd4757.zip
Remove trailing whitespace from many modules
Ignore-this: 1e28ff0974578d329bd3d593c1a5125e darcs-hash:20090705201205-1499c-581bd0bb43ab6096eccded6edbd54a7a2007b0d9.gz
Diffstat (limited to 'XMonad/Layout/Roledex.hs')
-rw-r--r--XMonad/Layout/Roledex.hs10
1 files changed, 5 insertions, 5 deletions
diff --git a/XMonad/Layout/Roledex.hs b/XMonad/Layout/Roledex.hs
index e5b1101..1d4343e 100644
--- a/XMonad/Layout/Roledex.hs
+++ b/XMonad/Layout/Roledex.hs
@@ -27,7 +27,7 @@ import Data.Ratio
-- $usage
-- You can use this module with the following in your @~\/.xmonad\/xmonad.hs@:
--
--- > import XMonad.Layout.Roledex
+-- > import XMonad.Layout.Roledex
--
-- Then edit your @layoutHook@ by adding the Roledex layout:
--
@@ -51,8 +51,8 @@ roledexLayout sc ws = return ([(W.focus ws, mainPane)] ++
where ups = W.up ws
dns = W.down ws
c = length ups + length dns
- rect = fst $ splitHorizontallyBy (2%3 :: Ratio Int) $ fst (splitVerticallyBy (2%3 :: Ratio Int) sc)
- gw = div' (w - rw) (fromIntegral c)
+ rect = fst $ splitHorizontallyBy (2%3 :: Ratio Int) $ fst (splitVerticallyBy (2%3 :: Ratio Int) sc)
+ gw = div' (w - rw) (fromIntegral c)
where
(Rectangle _ _ w _) = sc
(Rectangle _ _ rw _) = rect
@@ -60,12 +60,12 @@ roledexLayout sc ws = return ([(W.focus ws, mainPane)] ++
where
(Rectangle _ _ _ h) = sc
(Rectangle _ _ _ rh) = rect
- mainPane = mrect (gw * fromIntegral c) (gh * fromIntegral c) rect
+ mainPane = mrect (gw * fromIntegral c) (gh * fromIntegral c) rect
mrect mx my (Rectangle x y w h) = Rectangle (x + (fromIntegral mx)) (y + (fromIntegral my)) w h
tops = map f $ cd c (length dns)
bottoms = map f $ [0..(length dns)]
f n = mrect (gw * (fromIntegral n)) (gh * (fromIntegral n)) rect
- cd n m = if n > m
+ cd n m = if n > m
then (n - 1) : (cd (n-1) m)
else []