diff options
Diffstat (limited to 'XMonad/Layout')
-rw-r--r-- | XMonad/Layout/NoFrillsDecoration.hs | 48 |
1 files changed, 48 insertions, 0 deletions
diff --git a/XMonad/Layout/NoFrillsDecoration.hs b/XMonad/Layout/NoFrillsDecoration.hs new file mode 100644 index 0000000..0101b23 --- /dev/null +++ b/XMonad/Layout/NoFrillsDecoration.hs @@ -0,0 +1,48 @@ +{-# LANGUAGE FlexibleInstances, MultiParamTypeClasses #-} +---------------------------------------------------------------------------- +-- | +-- Module : XMonad.Layout.NoFrillsDecoration +-- Copyright : (c) Jan Vornberger 2009 +-- License : BSD3-style (see LICENSE) +-- +-- Maintainer : jan.vornberger@informatik.uni-oldenburg.de +-- Stability : unstable +-- Portability : not portable +-- +-- Most basic version of decoration for windows without any additional +-- modifications. In contrast to "XMonad.Layout.SimpleDecoration" this will +-- result in title bars that span the entire window instead of being only the +-- length of the window title. +-- +----------------------------------------------------------------------------- + +module XMonad.Layout.NoFrillsDecoration + ( -- * Usage: + -- $usage + noFrillsDeco + ) where + +import XMonad.Layout.Decoration + +-- $usage +-- You can use this module with the following in your +-- @~\/.xmonad\/xmonad.hs@: +-- +-- > import XMonad.Layout.NoFrillsDecoration +-- +-- Then edit your @layoutHook@ by adding the NoFrillsDecoration to +-- your layout: +-- +-- > myL = noFrillsDeco shrinkText defaultTheme (layoutHook defaultConfig) +-- > main = xmonad defaultConfig { layoutHook = myL } +-- + +-- | Add very simple decorations to windows of a layout. +noFrillsDeco :: (Eq a, Shrinker s) => s -> Theme + -> l a -> ModifiedLayout (Decoration NoFrillsDecoration s) l a +noFrillsDeco s c = decoration s c $ NFD True + +data NoFrillsDecoration a = NFD Bool deriving (Show, Read) + +instance Eq a => DecorationStyle NoFrillsDecoration a where + describeDeco _ = "NoFrillsDeco" |