aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Actions
diff options
context:
space:
mode:
Diffstat (limited to 'XMonad/Actions')
-rw-r--r--XMonad/Actions/BluetileCommands.hs2
-rw-r--r--XMonad/Actions/CopyWindow.hs2
-rw-r--r--XMonad/Actions/GroupNavigation.hs2
-rw-r--r--XMonad/Actions/MouseResize.hs4
-rw-r--r--XMonad/Actions/Navigation2D.hs6
-rw-r--r--XMonad/Actions/Plane.hs6
-rw-r--r--XMonad/Actions/SpawnOn.hs4
-rw-r--r--XMonad/Actions/TopicSpace.hs2
-rw-r--r--XMonad/Actions/UpdateFocus.hs4
-rw-r--r--XMonad/Actions/WindowNavigation.hs2
-rw-r--r--XMonad/Actions/WorkspaceCursors.hs4
11 files changed, 19 insertions, 19 deletions
diff --git a/XMonad/Actions/BluetileCommands.hs b/XMonad/Actions/BluetileCommands.hs
index a8e0f2b..b410015 100644
--- a/XMonad/Actions/BluetileCommands.hs
+++ b/XMonad/Actions/BluetileCommands.hs
@@ -36,7 +36,7 @@ import System.Exit
--
-- Then edit your @handleEventHook@:
--
--- > main = xmonad defaultConfig { handleEventHook = serverModeEventHook' bluetileCommands }
+-- > main = xmonad def { handleEventHook = serverModeEventHook' bluetileCommands }
--
-- See the documentation of "XMonad.Hooks.ServerMode" for details on
-- how to actually invoke the commands from external programs.
diff --git a/XMonad/Actions/CopyWindow.hs b/XMonad/Actions/CopyWindow.hs
index 191c17f..7db7bc1 100644
--- a/XMonad/Actions/CopyWindow.hs
+++ b/XMonad/Actions/CopyWindow.hs
@@ -87,7 +87,7 @@ import qualified XMonad.StackSet as W
-- >
-- > main = do
-- > h <- spawnPipe "xmobar"
--- > xmonad defaultConfig { logHook = sampleLogHook h }
+-- > xmonad def { logHook = sampleLogHook h }
-- | Copy the focused window to a workspace.
copy :: (Eq s, Eq i, Eq a) => i -> W.StackSet i l a s sd -> W.StackSet i l a s sd
diff --git a/XMonad/Actions/GroupNavigation.hs b/XMonad/Actions/GroupNavigation.hs
index 639876b..408a5cd 100644
--- a/XMonad/Actions/GroupNavigation.hs
+++ b/XMonad/Actions/GroupNavigation.hs
@@ -73,7 +73,7 @@ Finally, you can define keybindings to jump to the most recent window
matching a certain Boolean query. To do this, you need to add
'historyHook' to your logHook:
-> main = xmonad $ defaultConfig { logHook = historyHook }
+> main = xmonad $ def { logHook = historyHook }
Then the following keybindings, for example, allow you to return to
the most recent xterm or emacs window or to simply to the most recent
diff --git a/XMonad/Actions/MouseResize.hs b/XMonad/Actions/MouseResize.hs
index 5441644..fd04fb0 100644
--- a/XMonad/Actions/MouseResize.hs
+++ b/XMonad/Actions/MouseResize.hs
@@ -43,11 +43,11 @@ import XMonad.Util.XUtils
--
-- Then edit your @layoutHook@ by modifying a given layout:
--
--- > myLayout = mouseResize $ windowArrange $ layoutHook defaultConfig
+-- > myLayout = mouseResize $ windowArrange $ layoutHook def
--
-- and then:
--
--- > main = xmonad defaultConfig { layoutHook = myLayout }
+-- > main = xmonad def { layoutHook = myLayout }
--
-- For more detailed instructions on editing the layoutHook see:
--
diff --git a/XMonad/Actions/Navigation2D.hs b/XMonad/Actions/Navigation2D.hs
index 27d772b..379180d 100644
--- a/XMonad/Actions/Navigation2D.hs
+++ b/XMonad/Actions/Navigation2D.hs
@@ -115,7 +115,7 @@ import XMonad.Util.Types
-- and add the configuration of the module to your main function:
--
-- > main = xmonad $ withNavigation2DConfig defaultNavigation2DConfig
--- > $ defaultConfig
+-- > $ def
--
-- For detailed instruction on editing the key binding see:
--
@@ -150,7 +150,7 @@ import XMonad.Util.Types
-- > myNavigation2DConfig = defaultNavigation2DConfig { layoutNavigation = [("Full", centerNavigation)] }
-- >
-- > main = xmonad $ withNavigation2DConfig myNavigation2DConfig
--- > $ defaultConfig
+-- > $ def
--
-- The navigation between windows is based on their screen rectangles, which are
-- available /and meaningful/ only for mapped windows. Thus, as already said,
@@ -169,7 +169,7 @@ import XMonad.Util.Types
-- > }
-- >
-- > main = xmonad $ withNavigation2DConfig myNavigation2DConfig
--- > $ defaultConfig
+-- > $ def
--
-- With this setup, Left/Up navigation behaves like standard
-- 'XMonad.StackSet.focusUp' and Right/Down navigation behaves like
diff --git a/XMonad/Actions/Plane.hs b/XMonad/Actions/Plane.hs
index 3037719..fee41bc 100644
--- a/XMonad/Actions/Plane.hs
+++ b/XMonad/Actions/Plane.hs
@@ -52,9 +52,9 @@ import XMonad.Util.Run
--
-- > import XMonad.Actions.Plane
-- >
--- > main = xmonad defaultConfig {keys = myKeys}
+-- > main = xmonad def {keys = myKeys}
-- >
--- > myKeys conf = union (keys defaultConfig conf) $ myNewKeys conf
+-- > myKeys conf = union (keys def conf) $ myNewKeys conf
-- >
-- > myNewkeys (XConfig {modMask = modm}) = planeKeys modm (Lines 3) Finite
--
@@ -226,4 +226,4 @@ gconftool :: String
gconftool = "gconftool-2"
parameters :: [String]
-parameters = ["--get", "/apps/panel/applets/workspace_switcher_screen0/prefs/num_rows"] \ No newline at end of file
+parameters = ["--get", "/apps/panel/applets/workspace_switcher_screen0/prefs/num_rows"]
diff --git a/XMonad/Actions/SpawnOn.hs b/XMonad/Actions/SpawnOn.hs
index 1154ce5..df37c9d 100644
--- a/XMonad/Actions/SpawnOn.hs
+++ b/XMonad/Actions/SpawnOn.hs
@@ -45,9 +45,9 @@ import qualified XMonad.Util.ExtensibleState as XS
-- > import XMonad.Actions.SpawnOn
--
-- > main = do
--- > xmonad defaultConfig {
+-- > xmonad def {
-- > ...
--- > manageHook = manageSpawn <+> manageHook defaultConfig
+-- > manageHook = manageSpawn <+> manageHook def
-- > ...
-- > }
--
diff --git a/XMonad/Actions/TopicSpace.hs b/XMonad/Actions/TopicSpace.hs
index d081439..cf4fb0d 100644
--- a/XMonad/Actions/TopicSpace.hs
+++ b/XMonad/Actions/TopicSpace.hs
@@ -161,7 +161,7 @@ import qualified XMonad.Util.ExtensibleState as XS
-- > myConfig = do
-- > checkTopicConfig myTopics myTopicConfig
-- > myLogHook <- makeMyLogHook
--- > return $ defaultConfig
+-- > return $ def
-- > { borderWidth = 1 -- Width of the window border in pixels.
-- > , workspaces = myTopics
-- > , layoutHook = myModifiers myLayout
diff --git a/XMonad/Actions/UpdateFocus.hs b/XMonad/Actions/UpdateFocus.hs
index ead23d8..46d36b0 100644
--- a/XMonad/Actions/UpdateFocus.hs
+++ b/XMonad/Actions/UpdateFocus.hs
@@ -29,7 +29,7 @@ import Data.Monoid
-- following to your @~\/.xmonad\/xmonad.hs@:
--
-- > import XMonad.Actions.UpdateFocus
--- > xmonad $ defaultConfig {
+-- > xmonad $ def {
-- > ..
-- > startupHook = adjustEventInput
-- > handleEventHook = focusOnMouseMove
@@ -57,4 +57,4 @@ adjustEventInput = withDisplay $ \dpy -> do
rootw <- asks theRoot
io $ selectInput dpy rootw $ substructureRedirectMask .|. substructureNotifyMask
.|. enterWindowMask .|. leaveWindowMask .|. structureNotifyMask
- .|. buttonPressMask .|. pointerMotionMask \ No newline at end of file
+ .|. buttonPressMask .|. pointerMotionMask
diff --git a/XMonad/Actions/WindowNavigation.hs b/XMonad/Actions/WindowNavigation.hs
index c607dd2..af27733 100644
--- a/XMonad/Actions/WindowNavigation.hs
+++ b/XMonad/Actions/WindowNavigation.hs
@@ -62,7 +62,7 @@ import qualified Data.Set as S
--
-- > main = do
-- > config <- withWindowNavigation (xK_w, xK_a, xK_s, xK_d)
--- > $ defaultConfig { ... }
+-- > $ def { ... }
-- > xmonad config
--
-- Here, we pass in the keys for navigation in counter-clockwise order from up.
diff --git a/XMonad/Actions/WorkspaceCursors.hs b/XMonad/Actions/WorkspaceCursors.hs
index c33d998..eb7d7d7 100644
--- a/XMonad/Actions/WorkspaceCursors.hs
+++ b/XMonad/Actions/WorkspaceCursors.hs
@@ -69,8 +69,8 @@ import Data.Traversable(sequenceA)
-- > x <- xmobar conf
-- > xmonad x
-- >
--- > conf = additionalKeysP defaultConfig
--- > { layoutHook = workspaceCursors myCursors $ layoutHook defaultConfig
+-- > conf = additionalKeysP def
+-- > { layoutHook = workspaceCursors myCursors $ layoutHook def
-- > , workspaces = toList myCursors } $
-- > [("M-"++shift++control++[k], f direction depth)
-- > | (f,shift) <- zip [modifyLayer,shiftModifyLayer] ["","S-"]