aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Layout
diff options
context:
space:
mode:
Diffstat (limited to 'XMonad/Layout')
-rw-r--r--XMonad/Layout/Accordion.hs2
-rw-r--r--XMonad/Layout/BorderResize.hs2
-rw-r--r--XMonad/Layout/BoringWindows.hs2
-rw-r--r--XMonad/Layout/ButtonDecoration.hs4
-rw-r--r--XMonad/Layout/Circle.hs2
-rw-r--r--XMonad/Layout/Cross.hs2
-rw-r--r--XMonad/Layout/DecorationMadness.hs2
-rw-r--r--XMonad/Layout/Dishes.hs2
-rw-r--r--XMonad/Layout/DragPane.hs2
-rw-r--r--XMonad/Layout/Drawer.hs2
-rw-r--r--XMonad/Layout/DwmStyle.hs10
-rw-r--r--XMonad/Layout/FixedColumn.hs2
-rw-r--r--XMonad/Layout/Fullscreen.hs6
-rw-r--r--XMonad/Layout/Grid.hs2
-rw-r--r--XMonad/Layout/HintedGrid.hs2
-rw-r--r--XMonad/Layout/HintedTile.hs2
-rw-r--r--XMonad/Layout/IM.hs2
-rw-r--r--XMonad/Layout/ImageButtonDecoration.hs4
-rw-r--r--XMonad/Layout/IndependentScreens.hs6
-rw-r--r--XMonad/Layout/LayoutBuilder.hs2
-rw-r--r--XMonad/Layout/LayoutCombinators.hs2
-rw-r--r--XMonad/Layout/LayoutHints.hs6
-rw-r--r--XMonad/Layout/LimitWindows.hs2
-rw-r--r--XMonad/Layout/MagicFocus.hs4
-rw-r--r--XMonad/Layout/Magnifier.hs2
-rw-r--r--XMonad/Layout/Maximize.hs2
-rw-r--r--XMonad/Layout/Minimize.hs2
-rw-r--r--XMonad/Layout/Mosaic.hs2
-rw-r--r--XMonad/Layout/MosaicAlt.hs2
-rw-r--r--XMonad/Layout/MouseResizableTile.hs2
-rw-r--r--XMonad/Layout/MultiColumns.hs4
-rw-r--r--XMonad/Layout/Named.hs2
-rw-r--r--XMonad/Layout/NoFrillsDecoration.hs4
-rw-r--r--XMonad/Layout/PositionStoreFloat.hs2
-rw-r--r--XMonad/Layout/ResizableTile.hs2
-rw-r--r--XMonad/Layout/Roledex.hs2
-rw-r--r--XMonad/Layout/ShowWName.hs4
-rw-r--r--XMonad/Layout/SimpleDecoration.hs4
-rw-r--r--XMonad/Layout/SimpleFloat.hs2
-rw-r--r--XMonad/Layout/Simplest.hs2
-rw-r--r--XMonad/Layout/SimplestFloat.hs2
-rw-r--r--XMonad/Layout/Spiral.hs2
-rw-r--r--XMonad/Layout/StackTile.hs2
-rw-r--r--XMonad/Layout/SubLayouts.hs2
-rw-r--r--XMonad/Layout/TabBarDecoration.hs2
-rw-r--r--XMonad/Layout/Tabbed.hs4
-rw-r--r--XMonad/Layout/ThreeColumns.hs2
-rw-r--r--XMonad/Layout/ToggleLayouts.hs2
-rw-r--r--XMonad/Layout/TrackFloating.hs2
-rw-r--r--XMonad/Layout/TwoPane.hs2
-rw-r--r--XMonad/Layout/WindowArranger.hs6
-rw-r--r--XMonad/Layout/WindowNavigation.hs2
-rw-r--r--XMonad/Layout/WindowSwitcherDecoration.hs12
-rw-r--r--XMonad/Layout/WorkspaceDir.hs2
54 files changed, 79 insertions, 79 deletions
diff --git a/XMonad/Layout/Accordion.hs b/XMonad/Layout/Accordion.hs
index 90268c8..dc75c93 100644
--- a/XMonad/Layout/Accordion.hs
+++ b/XMonad/Layout/Accordion.hs
@@ -31,7 +31,7 @@ import Data.Ratio
-- Then edit your @layoutHook@ by adding the Accordion layout:
--
-- > myLayout = Accordion ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/BorderResize.hs b/XMonad/Layout/BorderResize.hs
index d67d022..21e7e92 100644
--- a/XMonad/Layout/BorderResize.hs
+++ b/XMonad/Layout/BorderResize.hs
@@ -40,7 +40,7 @@ import qualified Data.Map as M
--
-- > import XMonad.Layout.BorderResize
-- > myLayout = borderResize (... layout setup that reacts to SetGeometry ...)
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
type BorderBlueprint = (Rectangle, Glyph, BorderType)
diff --git a/XMonad/Layout/BoringWindows.hs b/XMonad/Layout/BoringWindows.hs
index 22517ee..cbea6a2 100644
--- a/XMonad/Layout/BoringWindows.hs
+++ b/XMonad/Layout/BoringWindows.hs
@@ -49,7 +49,7 @@ import qualified XMonad.StackSet as W
-- Then edit your @layoutHook@ by adding the layout modifier:
--
-- > myLayout = boringWindows (Full ||| etc..)
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- Then to your keybindings, add:
--
diff --git a/XMonad/Layout/ButtonDecoration.hs b/XMonad/Layout/ButtonDecoration.hs
index 8385c07..c37d6ce 100644
--- a/XMonad/Layout/ButtonDecoration.hs
+++ b/XMonad/Layout/ButtonDecoration.hs
@@ -40,8 +40,8 @@ import XMonad.Layout.DecorationAddons
-- Then edit your @layoutHook@ by adding the ButtonDecoration to
-- your layout:
--
--- > myL = buttonDeco shrinkText defaultThemeWithButtons (layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = buttonDeco shrinkText defaultThemeWithButtons (layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
buttonDeco :: (Eq a, Shrinker s) => s -> Theme
diff --git a/XMonad/Layout/Circle.hs b/XMonad/Layout/Circle.hs
index 5bd10d2..f9f09fe 100644
--- a/XMonad/Layout/Circle.hs
+++ b/XMonad/Layout/Circle.hs
@@ -32,7 +32,7 @@ import XMonad.StackSet (integrate, peek)
-- Then edit your @layoutHook@ by adding the Circle layout:
--
-- > myLayout = Circle ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Cross.hs b/XMonad/Layout/Cross.hs
index 9f37b06..b1f1112 100644
--- a/XMonad/Layout/Cross.hs
+++ b/XMonad/Layout/Cross.hs
@@ -29,7 +29,7 @@ import Control.Monad( msum )
-- Then edit your @layoutHook@ by adding one of the Cross layouts:
--
-- > myLayout = simpleCross ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- apply a factor to a Rectangle Dimension
diff --git a/XMonad/Layout/DecorationMadness.hs b/XMonad/Layout/DecorationMadness.hs
index 0ad373b..c463636 100644
--- a/XMonad/Layout/DecorationMadness.hs
+++ b/XMonad/Layout/DecorationMadness.hs
@@ -105,7 +105,7 @@ import XMonad.Layout.SimpleFloat
--
-- Then edit your @layoutHook@ by adding the layout you want:
--
--- > main = xmonad defaultConfig { layoutHook = someMadLayout }
+-- > main = xmonad def { layoutHook = someMadLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Dishes.hs b/XMonad/Layout/Dishes.hs
index 89723b5..805cc72 100644
--- a/XMonad/Layout/Dishes.hs
+++ b/XMonad/Layout/Dishes.hs
@@ -33,7 +33,7 @@ import Control.Monad (ap)
-- Then edit your @layoutHook@ by adding the Dishes layout:
--
-- > myLayout = Dishes 2 (1/6) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/DragPane.hs b/XMonad/Layout/DragPane.hs
index 37d70b5..720eaee 100644
--- a/XMonad/Layout/DragPane.hs
+++ b/XMonad/Layout/DragPane.hs
@@ -41,7 +41,7 @@ import XMonad.Util.XUtils
-- Then edit your @layoutHook@ by adding the DragPane layout:
--
-- > myLayout = dragPane Horizontal 0.1 0.5 ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Drawer.hs b/XMonad/Layout/Drawer.hs
index 9ced1a2..1dc0975 100644
--- a/XMonad/Layout/Drawer.hs
+++ b/XMonad/Layout/Drawer.hs
@@ -48,7 +48,7 @@ import XMonad.Layout.Reflect
-- > where
-- > drawer = simpleDrawer 0.01 0.3 (ClassName "Rhythmbox" `Or` ClassName "Xchat")
-- >
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- This will place the Rhythmbox and Xchat windows in at the top of the screen
-- only when using the 'Tall' layout. See "XMonad.Util.WindowProperties" for
diff --git a/XMonad/Layout/DwmStyle.hs b/XMonad/Layout/DwmStyle.hs
index b6c8196..6bba823 100644
--- a/XMonad/Layout/DwmStyle.hs
+++ b/XMonad/Layout/DwmStyle.hs
@@ -36,8 +36,8 @@ import XMonad.Layout.Decoration
-- Then edit your @layoutHook@ by adding the DwmStyle decoration to
-- your layout:
--
--- > myL = dwmStyle shrinkText defaultTheme (layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = dwmStyle shrinkText defaultTheme (layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- For more detailed instructions on editing the layoutHook see:
--
@@ -50,17 +50,17 @@ import XMonad.Layout.Decoration
--
-- and
--
--- > myL = dwmStyle shrinkText myDWConfig (layoutHook defaultConfig)
+-- > myL = dwmStyle shrinkText myDWConfig (layoutHook def)
--
-- A complete xmonad.hs file for this would therefore be:
--
-- > import XMonad
-- > import XMonad.Layout.DwmStyle
-- >
--- > main = xmonad defaultConfig {
+-- > main = xmonad def {
-- > layoutHook =
-- > dwmStyle shrinkText defaultTheme
--- > (layoutHook defaultConfig)
+-- > (layoutHook def)
-- > }
--
diff --git a/XMonad/Layout/FixedColumn.hs b/XMonad/Layout/FixedColumn.hs
index ad0c004..97bb36b 100644
--- a/XMonad/Layout/FixedColumn.hs
+++ b/XMonad/Layout/FixedColumn.hs
@@ -43,7 +43,7 @@ import XMonad.StackSet as W
-- Then edit your @layoutHook@ by adding the FixedColumn layout:
--
-- > myLayout = FixedColumn 1 20 80 10 ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Fullscreen.hs b/XMonad/Layout/Fullscreen.hs
index a60a742..386baab 100644
--- a/XMonad/Layout/Fullscreen.hs
+++ b/XMonad/Layout/Fullscreen.hs
@@ -53,9 +53,9 @@ import Control.Arrow (second)
-- To use this module, add 'fullscreenEventHook' and 'fullscreenManageHook'
-- to your config, i.e.
--
--- > xmonad defaultconfig { handleEventHook = fullscreenEventHook,
--- > manageHook = fullscreenManageHook,
--- > layoutHook = myLayouts }
+-- > xmonad def { handleEventHook = fullscreenEventHook,
+-- > manageHook = fullscreenManageHook,
+-- > layoutHook = myLayouts }
--
-- Now you can use layouts that respect fullscreen, for example the
-- provided 'fullscreenFull':
diff --git a/XMonad/Layout/Grid.hs b/XMonad/Layout/Grid.hs
index a2d39e0..845fa80 100644
--- a/XMonad/Layout/Grid.hs
+++ b/XMonad/Layout/Grid.hs
@@ -31,7 +31,7 @@ import XMonad.StackSet
-- Then edit your @layoutHook@ by adding the Grid layout:
--
-- > myLayout = Grid ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- You can also specify an aspect ratio for Grid to strive for with the
-- GridRatio constructor. For example, if you want Grid to try to make a grid
diff --git a/XMonad/Layout/HintedGrid.hs b/XMonad/Layout/HintedGrid.hs
index e7e09d5..5575d73 100644
--- a/XMonad/Layout/HintedGrid.hs
+++ b/XMonad/Layout/HintedGrid.hs
@@ -42,7 +42,7 @@ infixr 9 .
-- Then edit your @layoutHook@ by adding the 'Grid' layout:
--
-- > myLayout = Grid False ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- You can also specify an aspect ratio for Grid to strive for with the
-- GridRatio constructor:
diff --git a/XMonad/Layout/HintedTile.hs b/XMonad/Layout/HintedTile.hs
index c005889..fc3a856 100644
--- a/XMonad/Layout/HintedTile.hs
+++ b/XMonad/Layout/HintedTile.hs
@@ -38,7 +38,7 @@ import Control.Monad
-- > nmaster = 1
-- > ratio = 1/2
-- > delta = 3/100
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- Because both Xmonad and Xmonad.Layout.HintedTile define Tall,
-- you need to disambiguate Tall. If you are replacing the
diff --git a/XMonad/Layout/IM.hs b/XMonad/Layout/IM.hs
index e45fe2a..1414f1a 100644
--- a/XMonad/Layout/IM.hs
+++ b/XMonad/Layout/IM.hs
@@ -45,7 +45,7 @@ import XMonad.Util.WindowProperties
-- to consider is Tabbed layout).
--
-- > myLayout = withIM (1%7) (ClassName "Tkabber") Grid ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- Here @1%7@ is the part of the screen which your roster will occupy,
-- @ClassName \"Tkabber\"@ tells xmonad which window is actually your roster.
diff --git a/XMonad/Layout/ImageButtonDecoration.hs b/XMonad/Layout/ImageButtonDecoration.hs
index 0a44fe7..1737964 100644
--- a/XMonad/Layout/ImageButtonDecoration.hs
+++ b/XMonad/Layout/ImageButtonDecoration.hs
@@ -50,8 +50,8 @@ import XMonad.Layout.Maximize
-- Then edit your @layoutHook@ by adding the ImageButtonDecoration to
-- your layout:
--
--- > myL = imageButtonDeco shrinkText defaultThemeWithImageButtons (layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = imageButtonDeco shrinkText defaultThemeWithImageButtons (layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- The buttons' dimension and placements
diff --git a/XMonad/Layout/IndependentScreens.hs b/XMonad/Layout/IndependentScreens.hs
index b240f29..37be05b 100644
--- a/XMonad/Layout/IndependentScreens.hs
+++ b/XMonad/Layout/IndependentScreens.hs
@@ -45,7 +45,7 @@ import XMonad.Hooks.DynamicLog
--
-- You can define your workspaces by calling @withScreens@:
--
--- > myConfig = defaultConfig { workspaces = withScreens 2 ["web", "email", "irc"] }
+-- > myConfig = def { workspaces = withScreens 2 ["web", "email", "irc"] }
--
-- This will create \"physical\" workspaces with distinct internal names for
-- each (screen, virtual workspace) pair.
@@ -114,9 +114,9 @@ onCurrentScreen f vws = screen . current >>= f . flip marshall vws
--
-- > main = do
-- > nScreens <- countScreens
--- > xmonad $ defaultConfig {
+-- > xmonad $ def {
-- > ...
--- > workspaces = withScreens nScreens (workspaces defaultConfig),
+-- > workspaces = withScreens nScreens (workspaces def),
-- > ...
-- > }
--
diff --git a/XMonad/Layout/LayoutBuilder.hs b/XMonad/Layout/LayoutBuilder.hs
index 7ac2b80..016eabd 100644
--- a/XMonad/Layout/LayoutBuilder.hs
+++ b/XMonad/Layout/LayoutBuilder.hs
@@ -50,7 +50,7 @@ import Data.Maybe (isJust)
-- > $ (layoutN 1 (absBox (-200) 0 0 0) Nothing $ simpleTabbed)
-- > $ (layoutAll (absBox 0 0 (-512-200) 0) $ simpleTabbed)
-- > ) ||| Full ||| etc...
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- This will produce a layout similar to DragPane, but with the possibility to have multiple windows in the left half
-- and tabs that show the available windows. It will also produce a layout similar to ThreeColMid and a special layout
diff --git a/XMonad/Layout/LayoutCombinators.hs b/XMonad/Layout/LayoutCombinators.hs
index c8f19df..b0dce28 100644
--- a/XMonad/Layout/LayoutCombinators.hs
+++ b/XMonad/Layout/LayoutCombinators.hs
@@ -68,7 +68,7 @@ import XMonad.Layout.DragPane
-- example:
--
-- > myLayout = (Tall 1 (3/100) (1/2) *//* Full) ||| (Tall 1 (3/100) (1/2) ***||** Full) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the @layoutHook@ see:
--
diff --git a/XMonad/Layout/LayoutHints.hs b/XMonad/Layout/LayoutHints.hs
index c93b054..864cf6c 100644
--- a/XMonad/Layout/LayoutHints.hs
+++ b/XMonad/Layout/LayoutHints.hs
@@ -54,7 +54,7 @@ import qualified Data.Set as Set
-- to some layout:
--
-- > myLayout = layoutHints (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- Or, to center the adapted window in its available area:
--
@@ -74,8 +74,8 @@ import qualified Data.Set as Set
--
-- > myHandleEventHook = hintsEventHook <+> ...
-- >
--- > main = xmonad defaultConfig { handleEventHook = myHandleEventHook
--- > , ... }
+-- > main = xmonad def { handleEventHook = myHandleEventHook
+-- > , ... }
layoutHints :: (LayoutClass l a) => l a -> ModifiedLayout LayoutHints l a
layoutHints = ModifiedLayout (LayoutHints (0, 0))
diff --git a/XMonad/Layout/LimitWindows.hs b/XMonad/Layout/LimitWindows.hs
index 025a021..b0f89f8 100644
--- a/XMonad/Layout/LimitWindows.hs
+++ b/XMonad/Layout/LimitWindows.hs
@@ -47,7 +47,7 @@ import Data.Maybe(fromJust)
-- > import XMonad.Layout.LimitWindows
--
-- > myLayout = limitWindows 6 $ Tall 1 0.03 0.5 ||| Full ||| RandomOtherLayout...
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- You may also be interested in dynamically changing the number dynamically,
-- by binding keys to the 'increaseLimit', 'decreaseLimit', or 'setLimit'
diff --git a/XMonad/Layout/MagicFocus.hs b/XMonad/Layout/MagicFocus.hs
index 5e45d71..bc9cbcd 100644
--- a/XMonad/Layout/MagicFocus.hs
+++ b/XMonad/Layout/MagicFocus.hs
@@ -41,8 +41,8 @@ import qualified Data.Map as M
-- modifier:
--
-- > myLayout = magicFocus (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout,
--- > handleEventHook = promoteWarp }
+-- > main = xmonad def { layoutHook = myLayout,
+-- > handleEventHook = promoteWarp }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Magnifier.hs b/XMonad/Layout/Magnifier.hs
index 685830e..90a577b 100644
--- a/XMonad/Layout/Magnifier.hs
+++ b/XMonad/Layout/Magnifier.hs
@@ -44,7 +44,7 @@ import XMonad.Util.XUtils
-- to some layout:
--
-- > myLayout = magnifier (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- By default magnifier increases the focused window's size by 1.5.
-- You can also use:
diff --git a/XMonad/Layout/Maximize.hs b/XMonad/Layout/Maximize.hs
index f56bf07..589b962 100644
--- a/XMonad/Layout/Maximize.hs
+++ b/XMonad/Layout/Maximize.hs
@@ -36,7 +36,7 @@ import Data.List ( partition )
-- Then edit your @layoutHook@ by adding the Maximize layout modifier:
--
-- > myLayout = maximize (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Minimize.hs b/XMonad/Layout/Minimize.hs
index 28202c0..8f80090 100644
--- a/XMonad/Layout/Minimize.hs
+++ b/XMonad/Layout/Minimize.hs
@@ -41,7 +41,7 @@ import Foreign.C.Types (CLong)
-- Then edit your @layoutHook@ by adding the Minimize layout modifier:
--
-- > myLayout = minimize (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Mosaic.hs b/XMonad/Layout/Mosaic.hs
index f993c7d..05655d4 100644
--- a/XMonad/Layout/Mosaic.hs
+++ b/XMonad/Layout/Mosaic.hs
@@ -49,7 +49,7 @@ import Data.Monoid(Monoid,mempty, mappend)
-- Then edit your @layoutHook@ by adding the Mosaic layout:
--
-- > myLayout = mosaic 2 [3,2] ||| Full ||| etc..
--- > main = xmonad $ defaultConfig { layoutHook = myLayout }
+-- > main = xmonad $ def { layoutHook = myLayout }
--
-- Unfortunately, infinite lists break serialization, so don't use them. And if
-- the list is too short, it is extended with @++ repeat 1@, which covers the
diff --git a/XMonad/Layout/MosaicAlt.hs b/XMonad/Layout/MosaicAlt.hs
index 5f9753e..b0bc1b4 100644
--- a/XMonad/Layout/MosaicAlt.hs
+++ b/XMonad/Layout/MosaicAlt.hs
@@ -45,7 +45,7 @@ import Data.Ratio
-- Then edit your @layoutHook@ by adding the MosaicAlt layout:
--
-- > myLayout = MosaicAlt M.empty ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/MouseResizableTile.hs b/XMonad/Layout/MouseResizableTile.hs
index 1b6e558..277dfde 100644
--- a/XMonad/Layout/MouseResizableTile.hs
+++ b/XMonad/Layout/MouseResizableTile.hs
@@ -48,7 +48,7 @@ import Control.Applicative((<$>))
-- will not work correctly here because of the use of the mouse.)
--
-- > myLayout = mouseResizableTile ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
--
-- For more detailed instructions on editing the layoutHook see:
diff --git a/XMonad/Layout/MultiColumns.hs b/XMonad/Layout/MultiColumns.hs
index c68f57b..bea4be3 100644
--- a/XMonad/Layout/MultiColumns.hs
+++ b/XMonad/Layout/MultiColumns.hs
@@ -35,12 +35,12 @@ import Control.Monad
-- Then edit your @layoutHook@ by adding the multiCol layout:
--
-- > myLayouts = multiCol [1] 4 0.01 0.5 ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayouts }
+-- > main = xmonad def { layoutHook = myLayouts }
--
-- Or alternatively:
--
-- > myLayouts = Mirror (multiCol [1] 2 0.01 (-0.25)) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayouts }
+-- > main = xmonad def { layoutHook = myLayouts }
--
-- The maximum number of windows in a column can be controlled using the
-- IncMasterN messages and the column containing the focused window will be
diff --git a/XMonad/Layout/Named.hs b/XMonad/Layout/Named.hs
index 25ae437..57b0f33 100644
--- a/XMonad/Layout/Named.hs
+++ b/XMonad/Layout/Named.hs
@@ -34,7 +34,7 @@ import XMonad.Layout.Renamed
-- to some layout:
--
-- > myLayout = named "real big" Full ||| (nameTail $ named "real big" $ Full) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/NoFrillsDecoration.hs b/XMonad/Layout/NoFrillsDecoration.hs
index c6cf122..722c13c 100644
--- a/XMonad/Layout/NoFrillsDecoration.hs
+++ b/XMonad/Layout/NoFrillsDecoration.hs
@@ -37,8 +37,8 @@ import XMonad.Layout.SimpleDecoration
-- Then edit your @layoutHook@ by adding the NoFrillsDecoration to
-- your layout:
--
--- > myL = noFrillsDeco shrinkText defaultTheme (layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = noFrillsDeco shrinkText defaultTheme (layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- | Add very simple decorations to windows of a layout.
diff --git a/XMonad/Layout/PositionStoreFloat.hs b/XMonad/Layout/PositionStoreFloat.hs
index ea38a00..d793178 100644
--- a/XMonad/Layout/PositionStoreFloat.hs
+++ b/XMonad/Layout/PositionStoreFloat.hs
@@ -46,7 +46,7 @@ import Data.List(nub)
--
-- > myLayouts = floatingDeco $ borderResize $ positionStoreFloat ||| etc..
-- > where floatingDeco l = noFrillsDeco shrinkText defaultTheme l
--- > main = xmonad defaultConfig { layoutHook = myLayouts }
+-- > main = xmonad def { layoutHook = myLayouts }
--
-- See the documentation of "XMonad.Hooks.PositionStoreHooks" on how
-- to add the support hooks.
diff --git a/XMonad/Layout/ResizableTile.hs b/XMonad/Layout/ResizableTile.hs
index 20a5ea4..325779c 100644
--- a/XMonad/Layout/ResizableTile.hs
+++ b/XMonad/Layout/ResizableTile.hs
@@ -34,7 +34,7 @@ import Data.List ((\\))
-- Then edit your @layoutHook@ by adding the ResizableTile layout:
--
-- > myLayout = ResizableTall 1 (3/100) (1/2) [] ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Roledex.hs b/XMonad/Layout/Roledex.hs
index cc1ca50..5d82d5f 100644
--- a/XMonad/Layout/Roledex.hs
+++ b/XMonad/Layout/Roledex.hs
@@ -33,7 +33,7 @@ import Data.Ratio
-- Then edit your @layoutHook@ by adding the Roledex layout:
--
-- > myLayout = Roledex ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/ShowWName.hs b/XMonad/Layout/ShowWName.hs
index 59b0d70..827dc59 100644
--- a/XMonad/Layout/ShowWName.hs
+++ b/XMonad/Layout/ShowWName.hs
@@ -34,8 +34,8 @@ import XMonad.Util.XUtils
-- @~\/.xmonad\/xmonad.hs@:
--
-- > import XMonad.Layout.ShowWName
--- > myLayout = layoutHook defaultConfig
--- > main = xmonad defaultConfig { layoutHook = showWName myLayout }
+-- > myLayout = layoutHook def
+-- > main = xmonad def { layoutHook = showWName myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/SimpleDecoration.hs b/XMonad/Layout/SimpleDecoration.hs
index c969744..2006b21 100644
--- a/XMonad/Layout/SimpleDecoration.hs
+++ b/XMonad/Layout/SimpleDecoration.hs
@@ -38,8 +38,8 @@ import XMonad.Layout.Decoration
-- Then edit your @layoutHook@ by adding the SimpleDecoration decoration to
-- your layout:
--
--- > myL = simpleDeco shrinkText defaultTheme (layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = simpleDeco shrinkText defaultTheme (layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/SimpleFloat.hs b/XMonad/Layout/SimpleFloat.hs
index e536e40..f12840e 100644
--- a/XMonad/Layout/SimpleFloat.hs
+++ b/XMonad/Layout/SimpleFloat.hs
@@ -39,7 +39,7 @@ import XMonad.Layout.WindowArranger
-- Then edit your @layoutHook@ by adding the SimpleFloat layout:
--
-- > myLayout = simpleFloat ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Simplest.hs b/XMonad/Layout/Simplest.hs
index a167c68..77b5f1f 100644
--- a/XMonad/Layout/Simplest.hs
+++ b/XMonad/Layout/Simplest.hs
@@ -30,7 +30,7 @@ import qualified XMonad.StackSet as S
-- Then edit your @layoutHook@ by adding the Simplest layout:
--
-- > myLayout = Simplest ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/SimplestFloat.hs b/XMonad/Layout/SimplestFloat.hs
index f9433ee..8e98342 100644
--- a/XMonad/Layout/SimplestFloat.hs
+++ b/XMonad/Layout/SimplestFloat.hs
@@ -34,7 +34,7 @@ import XMonad.Util.XUtils (fi)
-- Then edit your @layoutHook@ by adding the SimplestFloat layout:
--
-- > myLayout = simplestFloat ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Spiral.hs b/XMonad/Layout/Spiral.hs
index a57d5f8..1527abc 100644
--- a/XMonad/Layout/Spiral.hs
+++ b/XMonad/Layout/Spiral.hs
@@ -37,7 +37,7 @@ import XMonad.StackSet ( integrate )
-- Then edit your @layoutHook@ by adding the Spiral layout:
--
-- > myLayout = spiral (6/7) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/StackTile.hs b/XMonad/Layout/StackTile.hs
index a86cc0e..518f855 100644
--- a/XMonad/Layout/StackTile.hs
+++ b/XMonad/Layout/StackTile.hs
@@ -33,7 +33,7 @@ import Control.Monad
-- Then edit your @layoutHook@ by adding the StackTile layout:
--
-- > myLayout = StackTile 1 (3/100) (1/2) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/SubLayouts.hs b/XMonad/Layout/SubLayouts.hs
index 5fd1375..73cea67 100644
--- a/XMonad/Layout/SubLayouts.hs
+++ b/XMonad/Layout/SubLayouts.hs
@@ -123,7 +123,7 @@ import Data.Map(Map)
--
-- > myLayout = windowNavigation $ subTabbed $ boringWindows $
-- > Tall 1 (3/100) (1/2) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- "XMonad.Layout.WindowNavigation" is used to specify which windows to merge,
-- and it is not integrated into the modifier because it can be configured, and
diff --git a/XMonad/Layout/TabBarDecoration.hs b/XMonad/Layout/TabBarDecoration.hs
index f8be09c..3a61996 100644
--- a/XMonad/Layout/TabBarDecoration.hs
+++ b/XMonad/Layout/TabBarDecoration.hs
@@ -36,7 +36,7 @@ import XMonad.Prompt ( XPPosition (..) )
--
-- Then edit your @layoutHook@ by adding the layout you want:
--
--- > main = xmonad defaultConfig { layoutHook = simpleTabBar $ layoutHook defaultConfig}
+-- > main = xmonad def { layoutHook = simpleTabBar $ layoutHook def}
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/Tabbed.hs b/XMonad/Layout/Tabbed.hs
index e8455ed..c140984 100644
--- a/XMonad/Layout/Tabbed.hs
+++ b/XMonad/Layout/Tabbed.hs
@@ -51,7 +51,7 @@ import XMonad.Layout.Simplest ( Simplest(Simplest) )
--
-- and then:
--
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- This layout has hardcoded behaviour for mouse clicks on tab decorations:
-- Left click on the tab switches focus to that window.
@@ -82,7 +82,7 @@ import XMonad.Layout.Simplest ( Simplest(Simplest) )
--
-- > import XMonad
-- > import XMonad.Layout.Tabbed
--- > main = xmonad defaultConfig { layoutHook = simpleTabbed }
+-- > main = xmonad def { layoutHook = simpleTabbed }
simpleTabbed :: ModifiedLayout (Decoration TabbedDecoration DefaultShrinker) Simplest Window
simpleTabbed = tabbed shrinkText defaultTheme
diff --git a/XMonad/Layout/ThreeColumns.hs b/XMonad/Layout/ThreeColumns.hs
index 58a625a..0a353f9 100644
--- a/XMonad/Layout/ThreeColumns.hs
+++ b/XMonad/Layout/ThreeColumns.hs
@@ -39,7 +39,7 @@ import Control.Monad
-- Then edit your @layoutHook@ by adding the ThreeCol layout:
--
-- > myLayout = ThreeCol 1 (3/100) (1/2) ||| ThreeColMid 1 (3/100) (1/2) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- The first argument specifies how many windows initially appear in the main
-- window. The second argument argument specifies the amount to resize while
diff --git a/XMonad/Layout/ToggleLayouts.hs b/XMonad/Layout/ToggleLayouts.hs
index a0193ff..af4953f 100644
--- a/XMonad/Layout/ToggleLayouts.hs
+++ b/XMonad/Layout/ToggleLayouts.hs
@@ -30,7 +30,7 @@ import XMonad.StackSet (Workspace (..))
-- Then edit your @layoutHook@ by adding the ToggleLayouts layout:
--
-- > myLayout = toggleLayouts Full (Tall 1 (3/100) (1/2)) ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/TrackFloating.hs b/XMonad/Layout/TrackFloating.hs
index b0e35e4..83936a8 100644
--- a/XMonad/Layout/TrackFloating.hs
+++ b/XMonad/Layout/TrackFloating.hs
@@ -126,7 +126,7 @@ focusWin st@(W.Stack f u d) w
Apply to your layout in a config like:
-> main = xmonad (defaultConfig{
+> main = xmonad (def{
> layoutHook = trackFloating (useTransientFor
> (noBorders Full ||| Tall 1 0.3 0.5)),
> ...
diff --git a/XMonad/Layout/TwoPane.hs b/XMonad/Layout/TwoPane.hs
index 3736e4d..b83f6d2 100644
--- a/XMonad/Layout/TwoPane.hs
+++ b/XMonad/Layout/TwoPane.hs
@@ -33,7 +33,7 @@ import XMonad.StackSet ( focus, up, down)
-- Then edit your @layoutHook@ by adding the TwoPane layout:
--
-- > myLayout = TwoPane (3/100) (1/2) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/WindowArranger.hs b/XMonad/Layout/WindowArranger.hs
index a74e7d3..1c2a270 100644
--- a/XMonad/Layout/WindowArranger.hs
+++ b/XMonad/Layout/WindowArranger.hs
@@ -38,12 +38,12 @@ import Data.List
-- @~\/.xmonad\/xmonad.hs@:
--
-- > import XMonad.Layout.WindowArranger
--- > myLayout = layoutHook defaultConfig
--- > main = xmonad defaultConfig { layoutHook = windowArrange myLayout }
+-- > myLayout = layoutHook def
+-- > main = xmonad def { layoutHook = windowArrange myLayout }
--
-- or
--
--- > main = xmonad defaultConfig { layoutHook = windowArrangeAll myLayout }
+-- > main = xmonad def { layoutHook = windowArrangeAll myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/WindowNavigation.hs b/XMonad/Layout/WindowNavigation.hs
index 0244532..ebfa553 100644
--- a/XMonad/Layout/WindowNavigation.hs
+++ b/XMonad/Layout/WindowNavigation.hs
@@ -42,7 +42,7 @@ import XMonad.Util.XUtils
-- to some layout:
--
-- > myLayout = windowNavigation (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Layout/WindowSwitcherDecoration.hs b/XMonad/Layout/WindowSwitcherDecoration.hs
index 4778314..07cb022 100644
--- a/XMonad/Layout/WindowSwitcherDecoration.hs
+++ b/XMonad/Layout/WindowSwitcherDecoration.hs
@@ -43,8 +43,8 @@ import Foreign.C.Types(CInt)
-- Then edit your @layoutHook@ by adding the WindowSwitcherDecoration to
-- your layout:
--
--- > myL = windowSwitcherDecoration shrinkText defaultTheme (draggingVisualizer $ layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = windowSwitcherDecoration shrinkText defaultTheme (draggingVisualizer $ layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- There is also a version of the decoration that contains buttons like
-- "XMonad.Layout.ButtonDecoration". To use that version, you will need to
@@ -53,8 +53,8 @@ import Foreign.C.Types(CInt)
--
-- > import XMonad.Layout.DecorationAddons
-- >
--- > myL = windowSwitcherDecorationWithButtons shrinkText defaultThemeWithButtons (draggingVisualizer $ layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = windowSwitcherDecorationWithButtons shrinkText defaultThemeWithButtons (draggingVisualizer $ layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
-- Additionaly, there is a version of the decoration that contains image buttons like
-- "XMonad.Layout.ImageButtonDecoration". To use that version, you will need to
@@ -63,8 +63,8 @@ import Foreign.C.Types(CInt)
--
-- > import XMonad.Layout.ImageButtonDecoration
-- >
--- > myL = windowSwitcherDecorationWithImageButtons shrinkText defaultThemeWithImageButtons (draggingVisualizer $ layoutHook defaultConfig)
--- > main = xmonad defaultConfig { layoutHook = myL }
+-- > myL = windowSwitcherDecorationWithImageButtons shrinkText defaultThemeWithImageButtons (draggingVisualizer $ layoutHook def)
+-- > main = xmonad def { layoutHook = myL }
--
windowSwitcherDecoration :: (Eq a, Shrinker s) => s -> Theme
diff --git a/XMonad/Layout/WorkspaceDir.hs b/XMonad/Layout/WorkspaceDir.hs
index b844cf0..ae39d4b 100644
--- a/XMonad/Layout/WorkspaceDir.hs
+++ b/XMonad/Layout/WorkspaceDir.hs
@@ -47,7 +47,7 @@ import XMonad.StackSet ( tag, currentTag )
-- to some layout:
--
-- > myLayout = workspaceDir "~" (Tall 1 (3/100) (1/2)) ||| Full ||| etc..
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--