mirror of
https://github.com/xmonad/xmonad.git
synced 2025-05-19 08:30:21 -07:00
Remove trailing spaces, no content changed
This commit is contained in:
parent
b3fc66b15b
commit
df4bda60ff
8
Main.hs
8
Main.hs
@ -3,7 +3,7 @@
|
||||
-- Module : Main.hs
|
||||
-- Copyright : (c) Spencer Janssen 2007
|
||||
-- License : BSD3-style (see LICENSE)
|
||||
--
|
||||
--
|
||||
-- Maintainer : sjanssen@cse.unl.edu
|
||||
-- Stability : unstable
|
||||
-- Portability : not portable, uses mtl, X11, posix
|
||||
@ -30,7 +30,7 @@ import Config
|
||||
|
||||
--
|
||||
-- The main entry point
|
||||
--
|
||||
--
|
||||
main :: IO ()
|
||||
main = do
|
||||
dpy <- openDisplay ""
|
||||
@ -121,7 +121,7 @@ grabKeys dpy rootw = do
|
||||
-- XCreateWindowEvent(3X11)
|
||||
-- Window manager clients normally should ignore this window if the
|
||||
-- override_redirect member is True.
|
||||
--
|
||||
--
|
||||
|
||||
handle :: Event -> X ()
|
||||
|
||||
@ -172,7 +172,7 @@ handle e@(ConfigureRequestEvent {window = w}) = do
|
||||
dpy <- gets display
|
||||
ws <- gets workspace
|
||||
|
||||
when (W.member w ws) $ -- already managed, reconfigure (see client:configure()
|
||||
when (W.member w ws) $ -- already managed, reconfigure (see client:configure()
|
||||
trace ("Reconfigure already managed window: " ++ show w)
|
||||
|
||||
io $ configureWindow dpy (window e) (value_mask e) $ WindowChanges
|
||||
|
@ -40,7 +40,7 @@ refresh = do
|
||||
fullWindow w = move w sc >> io (raiseWindow d w)
|
||||
|
||||
-- runRects draws the windows, figuring out their rectangles.
|
||||
-- The code here is for a horizontal split, and tr is possibly
|
||||
-- The code here is for a horizontal split, and tr is possibly
|
||||
-- used to convert to the vertical case. The comments
|
||||
-- speak in terms of the horizontal case.
|
||||
runRects :: Rectangle -> (Rectangle -> Rectangle)
|
||||
@ -58,7 +58,7 @@ refresh = do
|
||||
ns = map (/ sum ds) ds -- normalized ratios for rhs.
|
||||
|
||||
-- Normalize dispositions while we have the opportunity.
|
||||
-- This is bad. Rational numbers might space leak each
|
||||
-- This is bad. Rational numbers might space leak each
|
||||
-- time we make an adjustment. Floating point numbers are
|
||||
-- better here. I am being paranoid.
|
||||
zipWithM_ (\ratio a -> disposeW a (dfix ratio)) ns s
|
||||
@ -103,7 +103,7 @@ refresh = do
|
||||
whenJust (W.peek ws) setFocus
|
||||
|
||||
-- | switchLayout. Switch to another layout scheme. Switches the
|
||||
-- current workspace.
|
||||
-- current workspace.
|
||||
switchLayout :: X ()
|
||||
switchLayout = layout $ \fl -> fl { layoutType = rot (layoutType fl) }
|
||||
|
||||
@ -111,7 +111,7 @@ switchLayout = layout $ \fl -> fl { layoutType = rot (layoutType fl) }
|
||||
changeVert :: Rational -> X ()
|
||||
changeVert delta = do
|
||||
l <- gets (layoutType . currentDesc)
|
||||
case l of
|
||||
case l of
|
||||
Vert -> layout $ \d -> d {vertTileFrac = min 1 $
|
||||
max 0 $
|
||||
vertTileFrac d + delta}
|
||||
@ -127,7 +127,7 @@ changeHorz delta = do
|
||||
horzTileFrac d + delta}
|
||||
_ -> return ()
|
||||
|
||||
-- | changeSize. Changes the size of the window, except in Full mode, with the
|
||||
-- | changeSize. Changes the size of the window, except in Full mode, with the
|
||||
-- size remaining above the given mini-mum.
|
||||
changeSize :: Rational -> Rational -> X ()
|
||||
changeSize delta mini = do
|
||||
@ -143,7 +143,7 @@ changeSize delta mini = do
|
||||
refresh
|
||||
|
||||
-- | layout. Modify the current workspace's layout with a pure
|
||||
-- function and refresh.
|
||||
-- function and refresh.
|
||||
layout :: (LayoutDesc -> LayoutDesc) -> X ()
|
||||
layout f = do
|
||||
modify $ \s ->
|
||||
|
4
README
4
README
@ -6,7 +6,7 @@ Motivation:
|
||||
more correct window manager in fewer lines of code, using strong
|
||||
static typing. Enter Haskell.
|
||||
|
||||
If the aim of dwm is to fit in under 2000 lines of C, the aim of
|
||||
If the aim of dwm is to fit in under 2000 lines of C, the aim of
|
||||
xmonad is to fit in under 400 lines of Haskell with similar functionality.
|
||||
|
||||
Building:
|
||||
@ -30,7 +30,7 @@ And then build with Cabal:
|
||||
runhaskell Setup.lhs build
|
||||
runhaskell Setup.lhs install
|
||||
|
||||
Then add:
|
||||
Then add:
|
||||
|
||||
exec /home/dons/bin/xmonad
|
||||
|
||||
|
@ -3,7 +3,7 @@
|
||||
-- Module : StackSet
|
||||
-- Copyright : (c) Don Stewart 2007
|
||||
-- License : BSD3-style (see LICENSE)
|
||||
--
|
||||
--
|
||||
-- Maintainer : dons@cse.unsw.edu.au
|
||||
-- Stability : stable
|
||||
-- Portability : portable, needs GHC 6.6
|
||||
@ -89,7 +89,7 @@ fromList (o,xs) = view o $ foldr (\(i,ys) s ->
|
||||
toList :: StackSet a -> (Int,[[a]])
|
||||
toList x = (current x, map snd $ M.toList (stacks x))
|
||||
|
||||
-- | Push. Insert an element onto the top of the current stack.
|
||||
-- | Push. Insert an element onto the top of the current stack.
|
||||
-- If the element is already in the current stack, it is moved to the top.
|
||||
-- If the element is managed on another stack, it is removed from that
|
||||
-- stack first.
|
||||
|
Loading…
x
Reference in New Issue
Block a user