mirror of
https://github.com/xmonad/xmonad-contrib.git
synced 2025-07-31 04:01:51 -07:00
eliminate references to defaultConfig
This commit is contained in:
@@ -86,7 +86,7 @@ import XMonad.Util.Themes
|
||||
|
||||
arossatoConfig = do
|
||||
xmobar <- spawnPipe "xmobar" -- REMOVE this line if you do not have xmobar installed!
|
||||
return $ defaultConfig
|
||||
return $ def
|
||||
{ workspaces = ["home","var","dev","mail","web","doc"] ++
|
||||
map show [7 .. 9 :: Int]
|
||||
, logHook = myDynLog xmobar -- REMOVE this line if you do not have xmobar installed!
|
||||
@@ -128,7 +128,7 @@ arossatoConfig = do
|
||||
}
|
||||
|
||||
-- key bindings stuff
|
||||
defKeys = keys defaultConfig
|
||||
defKeys = keys def
|
||||
delKeys x = foldr M.delete (defKeys x) (toRemove x)
|
||||
newKeys x = foldr (uncurry M.insert) (delKeys x) (toAdd x)
|
||||
-- remove some of the default key bindings
|
||||
|
@@ -38,7 +38,7 @@ import qualified Data.Map as M
|
||||
-- > import qualified Data.Map as M
|
||||
-- > main = xmonad someConfig { keys = \c -> azertyKeys c `M.union` keys someConfig c }
|
||||
|
||||
azertyConfig = defaultConfig { keys = azertyKeys <+> keys defaultConfig }
|
||||
azertyConfig = def { keys = azertyKeys <+> keys def }
|
||||
|
||||
azertyKeys conf@(XConfig {modMask = modm}) = M.fromList $
|
||||
[((modm, xK_semicolon), sendMessage (IncMasterN (-1)))]
|
||||
|
@@ -198,7 +198,7 @@ bluetileLayoutHook = avoidStruts $ minimize $ boringWindows $ (
|
||||
floatingDeco l = buttonDeco shrinkText defaultThemeWithButtons l
|
||||
|
||||
bluetileConfig =
|
||||
defaultConfig
|
||||
def
|
||||
{ modMask = mod4Mask, -- logo key
|
||||
manageHook = bluetileManageHook,
|
||||
layoutHook = bluetileLayoutHook,
|
||||
|
@@ -22,7 +22,8 @@ module XMonad.Config.Desktop (
|
||||
-- the DE via a subset of the Extended Window Manager Hints (EWMH)
|
||||
-- specification. Extra xmonad settings unique to specific DE's are
|
||||
-- added by overriding or modifying @desktopConfig@ fields in the
|
||||
-- same way that @defaultConfig@ is customized in @~\/.xmonad/xmonad.hs@.
|
||||
-- same way that the default configuration is customized in
|
||||
-- @~\/.xmonad/xmonad.hs@.
|
||||
--
|
||||
-- For more information about EWMH see:
|
||||
--
|
||||
@@ -69,7 +70,7 @@ import qualified Data.Map as M
|
||||
-- <http://haskell.org/haskellwiki/Xmonad>
|
||||
--
|
||||
-- To configure xmonad for use with a DE or with DE tools like panels
|
||||
-- and pagers, in place of @defaultConfig@ in your @~\/.xmonad/xmonad.hs@,
|
||||
-- and pagers, in place of @def@ in your @~\/.xmonad/xmonad.hs@,
|
||||
-- use @desktopConfig@ or one of the other desktop configs from the
|
||||
-- @XMonad.Config@ namespace. The following setup and customization examples
|
||||
-- work the same way for the other desktop configs as for @desktopConfig@.
|
||||
@@ -88,7 +89,7 @@ import qualified Data.Map as M
|
||||
|
||||
-- $customizing
|
||||
-- To customize a desktop config, modify its fields as is illustrated with
|
||||
-- @defaultConfig@ in "XMonad.Doc.Extending#Extending xmonad".
|
||||
-- the default configuration @def@ in "XMonad.Doc.Extending#Extending xmonad".
|
||||
|
||||
-- $layouts
|
||||
-- See also "XMonad.Util.EZConfig" for more options for modifying key bindings.
|
||||
@@ -163,11 +164,11 @@ import qualified Data.Map as M
|
||||
-- > adjustEventInput
|
||||
--
|
||||
|
||||
desktopConfig = ewmh defaultConfig
|
||||
desktopConfig = ewmh def
|
||||
{ startupHook = setDefaultCursor xC_left_ptr
|
||||
, layoutHook = desktopLayoutModifiers $ layoutHook defaultConfig
|
||||
, manageHook = manageHook defaultConfig <+> manageDocks
|
||||
, keys = desktopKeys <+> keys defaultConfig }
|
||||
, layoutHook = desktopLayoutModifiers $ layoutHook def
|
||||
, manageHook = manageHook def <+> manageDocks
|
||||
, keys = desktopKeys <+> keys def }
|
||||
|
||||
desktopKeys (XConfig {modMask = modm}) = M.fromList $
|
||||
[ ((modm, xK_b), sendMessage ToggleStruts) ]
|
||||
|
@@ -206,7 +206,7 @@ instance PPrint ScreenId
|
||||
instance (Show a, Show b) => PPrint (Map a b)
|
||||
-- }}}
|
||||
-- main {{{
|
||||
dmwitConfig nScreens = defaultConfig {
|
||||
dmwitConfig nScreens = def {
|
||||
borderWidth = 2,
|
||||
workspaces = withScreens nScreens (map show [1..5]),
|
||||
terminal = "urxvt",
|
||||
|
@@ -117,7 +117,7 @@ keys x = M.fromList $
|
||||
++
|
||||
zip (zip (repeat (modMask x .|. shiftMask)) [xK_F1..xK_F12]) (map (withNthWorkspace copy) [0..])
|
||||
|
||||
config = ewmh defaultConfig
|
||||
config = ewmh def
|
||||
{ borderWidth = 1 -- Width of the window border in pixels.
|
||||
, XMonad.workspaces = ["mutt","iceweasel"]
|
||||
, layoutHook = showWName $ workspaceDir "~" $
|
||||
@@ -129,7 +129,7 @@ config = ewmh defaultConfig
|
||||
named "widescreen" ((mytab *||* mytab)
|
||||
****//* combineTwo Square mytab mytab) -- |||
|
||||
--mosaic 0.25 0.5
|
||||
, manageHook = manageHook defaultConfig <+> manageDocks -- add panel-handling
|
||||
, manageHook = manageHook def <+> manageDocks -- add panel-handling
|
||||
, terminal = "xterm" -- The preferred terminal program.
|
||||
, normalBorderColor = "#222222" -- Border color for unfocused windows.
|
||||
, focusedBorderColor = "#00ff00" -- Border color for focused windows.
|
||||
|
@@ -21,21 +21,21 @@ import XMonad.Layout.TwoPane
|
||||
import qualified Data.Map as M
|
||||
|
||||
sjanssenConfig =
|
||||
ewmh $ defaultConfig
|
||||
ewmh $ def
|
||||
{ terminal = "exec urxvt"
|
||||
, workspaces = ["irc", "web"] ++ map show [3 .. 9 :: Int]
|
||||
, mouseBindings = \(XConfig {modMask = modm}) -> M.fromList $
|
||||
[ ((modm, button1), (\w -> focus w >> mouseMoveWindow w))
|
||||
, ((modm, button2), (\w -> focus w >> windows W.swapMaster))
|
||||
, ((modm.|. shiftMask, button1), (\w -> focus w >> mouseResizeWindow w)) ]
|
||||
, keys = \c -> mykeys c `M.union` keys defaultConfig c
|
||||
, keys = \c -> mykeys c `M.union` keys def c
|
||||
, logHook = dynamicLogString sjanssenPP >>= xmonadPropLog
|
||||
, layoutHook = modifiers layouts
|
||||
, manageHook = composeAll [className =? x --> doShift w
|
||||
| (x, w) <- [ ("Firefox", "web")
|
||||
, ("Ktorrent", "7")
|
||||
, ("Amarokapp", "7")]]
|
||||
<+> manageHook defaultConfig <+> manageDocks <+> manageSpawn
|
||||
<+> manageHook def <+> manageDocks <+> manageSpawn
|
||||
<+> (isFullscreen --> doFullFloat)
|
||||
, startupHook = mapM_ spawnOnce spawns
|
||||
}
|
||||
|
Reference in New Issue
Block a user