mirror of
https://github.com/xmonad/xmonad.git
synced 2025-08-04 06:01:53 -07:00
Add Config.hs-boot, remove defaultLayoutDesc from XConf
This commit is contained in:
@@ -114,8 +114,8 @@ focusedBorderColor = "#ff0000"
|
||||
-- What layout to start in, and what the default proportion for the
|
||||
-- left pane should be in the tiled layout. See LayoutDesc and
|
||||
-- friends in XMonad.hs for options.
|
||||
startingLayoutDesc :: LayoutDesc
|
||||
startingLayoutDesc =
|
||||
defaultLayoutDesc :: LayoutDesc
|
||||
defaultLayoutDesc =
|
||||
LayoutDesc { layoutType = Full
|
||||
, tileFraction = 1%2 }
|
||||
|
||||
|
3
Config.hs-boot
Normal file
3
Config.hs-boot
Normal file
@@ -0,0 +1,3 @@
|
||||
module Config where
|
||||
import XMonad (LayoutDesc)
|
||||
defaultLayoutDesc :: LayoutDesc
|
1
Main.hs
1
Main.hs
@@ -54,7 +54,6 @@ main = do
|
||||
-- fromIntegral needed for X11 versions that use Int instead of CInt.
|
||||
, dimensions = (fromIntegral (displayWidth dpy dflt),
|
||||
fromIntegral (displayHeight dpy dflt))
|
||||
, defaultLayoutDesc = startingLayoutDesc
|
||||
, normalBorder = nbc
|
||||
, focusedBorder = fbc
|
||||
}
|
||||
|
@@ -29,6 +29,7 @@ import Graphics.X11.Xlib
|
||||
import Graphics.X11.Xlib.Extras
|
||||
|
||||
import XMonad
|
||||
import {-# SOURCE #-} Config
|
||||
|
||||
import qualified StackSet as W
|
||||
|
||||
@@ -41,11 +42,11 @@ import qualified StackSet as W
|
||||
refresh :: X ()
|
||||
refresh = do
|
||||
XState { workspace = ws, layoutDescs = fls } <- get
|
||||
XConf { xineScreens = xinesc, display = d, defaultLayoutDesc = dfltfl } <- ask
|
||||
XConf { xineScreens = xinesc, display = d } <- ask
|
||||
|
||||
flip mapM_ (M.assocs (W.screen2ws ws)) $ \(scn, n) -> do
|
||||
let sc = genericIndex xinesc scn -- temporary coercion!
|
||||
fl = M.findWithDefault dfltfl n fls
|
||||
fl = M.findWithDefault defaultLayoutDesc n fls
|
||||
mapM_ (\(w, rect) -> io $ moveWindowInside d w rect) $
|
||||
case layoutType fl of
|
||||
Full -> fmap (flip (,) sc) $ maybeToList $ W.peekStack n ws
|
||||
@@ -104,11 +105,10 @@ changeSplit delta = layout $ \fl ->
|
||||
-- function and refresh.
|
||||
layout :: (LayoutDesc -> LayoutDesc) -> X ()
|
||||
layout f = do
|
||||
dfl <- asks defaultLayoutDesc
|
||||
modify $ \s ->
|
||||
let fls = layoutDescs s
|
||||
n = W.current . workspace $ s
|
||||
fl = M.findWithDefault dfl n fls
|
||||
fl = M.findWithDefault defaultLayoutDesc n fls
|
||||
in s { layoutDescs = M.insert n (f fl) fls }
|
||||
refresh
|
||||
|
||||
|
@@ -49,7 +49,6 @@ data XConf = XConf
|
||||
-- used for hiding windows
|
||||
|
||||
, xineScreens :: ![Rectangle] -- ^ dimensions of each screen
|
||||
, defaultLayoutDesc :: !LayoutDesc -- ^ default layout
|
||||
, normalBorder :: !Color -- ^ border color of unfocused windows
|
||||
, focusedBorder :: !Color -- ^ border color of the focused window
|
||||
}
|
||||
|
Reference in New Issue
Block a user