From 6cb9fc74d97b5b7a0497c3b27c047435a8cbb0e1 Mon Sep 17 00:00:00 2001 From: Andrea Rossato Date: Fri, 25 Jan 2008 16:20:15 +0100 Subject: Add Layout.Simplest, the simplest layout darcs-hash:20080125152015-32816-678e0595c75eb62e0124152509accefdf782ae5d.gz --- XMonad/Layout/Simplest.hs | 41 +++++++++++++++++++++++++++++++++++++++++ 1 file changed, 41 insertions(+) create mode 100644 XMonad/Layout/Simplest.hs (limited to 'XMonad/Layout/Simplest.hs') diff --git a/XMonad/Layout/Simplest.hs b/XMonad/Layout/Simplest.hs new file mode 100644 index 0000000..5370013 --- /dev/null +++ b/XMonad/Layout/Simplest.hs @@ -0,0 +1,41 @@ +{-# LANGUAGE TypeSynonymInstances, MultiParamTypeClasses #-} +----------------------------------------------------------------------------- +-- | +-- Module : XMonad.Layout.Simplest +-- Copyright : (c) 2007 Andrea Rossato +-- License : BSD-style (see xmonad/LICENSE) +-- +-- Maintainer : andrea.rossato@unibz.it +-- Stability : unstable +-- Portability : unportable +-- +-- A very simple layout. The simplest, afaik. +----------------------------------------------------------------------------- + +module XMonad.Layout.Simplest + ( -- * Usage: + -- $usage + Simplest (..) + ) where + +import XMonad +import qualified XMonad.StackSet as S + +-- $usage +-- You can use this module with the following in your +-- @~\/.xmonad\/xmonad.hs@: +-- +-- > import XMonad.Layout.Simplest +-- +-- Then edit your @layoutHook@ by adding the Simplest layout: +-- +-- > myLayouts = Simplest ||| Full ||| etc.. +-- > main = xmonad defaultConfig { layoutHook = myLayouts } +-- +-- For more detailed instructions on editing the layoutHook see: +-- +-- "XMonad.Doc.Extending#Editing_the_layout_hook" + +data Simplest a = Simplest deriving (Show, Read) +instance LayoutClass Simplest Window where + pureLayout Simplest rec (S.Stack w l r) = zip (w : reverse l ++ r) (repeat rec) -- cgit v1.2.3