module XMonad.Layout.DecorationMadness
(
circleSimpleDefault
, circleDefault
, circleSimpleDefaultResizable
, circleDefaultResizable
, circleSimpleDeco
, circleSimpleDecoResizable
, circleDeco
, circleDecoResizable
, circleSimpleDwmStyle
, circleDwmStyle
, circleSimpleTabbed
, circleTabbed
, accordionSimpleDefault
, accordionDefault
, accordionSimpleDefaultResizable
, accordionDefaultResizable
, accordionSimpleDeco
, accordionSimpleDecoResizable
, accordionDeco
, accordionDecoResizable
, accordionSimpleDwmStyle
, accordionDwmStyle
, accordionSimpleTabbed
, accordionTabbed
, tallSimpleDefault
, tallDefault
, tallSimpleDefaultResizable
, tallDefaultResizable
, tallSimpleDeco
, tallDeco
, tallSimpleDecoResizable
, tallDecoResizable
, tallSimpleDwmStyle
, tallDwmStyle
, tallSimpleTabbed
, tallTabbed
, mirrorTallSimpleDefault
, mirrorTallDefault
, mirrorTallSimpleDefaultResizable
, mirrorTallDefaultResizable
, mirrorTallSimpleDeco
, mirrorTallDeco
, mirrorTallSimpleDecoResizable
, mirrorTallDecoResizable
, mirrorTallSimpleDwmStyle
, mirrorTallDwmStyle
, mirrorTallSimpleTabbed
, mirrorTallTabbed
, floatSimpleSimple
, floatSimple
, floatSimpleDefault
, floatDefault
, floatSimpleDwmStyle
, floatDwmStyle
, floatSimpleTabbed
, floatTabbed
, def, shrinkText
) where
import XMonad
import XMonad.Actions.MouseResize
import XMonad.Layout.Decoration
import XMonad.Layout.DwmStyle
import XMonad.Layout.SimpleDecoration
import XMonad.Layout.TabBarDecoration
import XMonad.Layout.Accordion
import XMonad.Layout.CircleEx
import XMonad.Layout.WindowArranger
import XMonad.Layout.SimpleFloat
circleSimpleDefault :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker) CircleEx Window
circleSimpleDefault :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker) CircleEx Window
circleSimpleDefault = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration forall a. CircleEx a
circle
circleDefault :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) CircleEx Window
circleDefault :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) CircleEx Window
circleDefault s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration forall a. CircleEx a
circle
circleSimpleDeco :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker) CircleEx Window
circleSimpleDeco :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker) CircleEx Window
circleSimpleDeco = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) forall a. CircleEx a
circle
circleDeco :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) CircleEx Window
circleDeco :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) CircleEx Window
circleDeco s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) forall a. CircleEx a
circle
circleSimpleDefaultResizable :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger CircleEx)) Window
circleSimpleDefaultResizable :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger CircleEx))
Window
circleSimpleDefaultResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. CircleEx a
circle)
circleDefaultResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger CircleEx)) Window
circleDefaultResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger CircleEx))
Window
circleDefaultResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. CircleEx a
circle)
circleSimpleDecoResizable :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger CircleEx)) Window
circleSimpleDecoResizable :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger CircleEx))
Window
circleSimpleDecoResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. CircleEx a
circle)
circleDecoResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger CircleEx)) Window
circleDecoResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger CircleEx))
Window
circleDecoResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. CircleEx a
circle)
circleSimpleDwmStyle :: ModifiedLayout (Decoration DwmStyle DefaultShrinker) CircleEx Window
circleSimpleDwmStyle :: ModifiedLayout
(Decoration DwmStyle DefaultShrinker) CircleEx Window
circleSimpleDwmStyle = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DwmStyle a
Dwm forall a. CircleEx a
circle
circleDwmStyle :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DwmStyle s) CircleEx Window
circleDwmStyle :: forall s.
Shrinker s =>
s
-> Theme -> ModifiedLayout (Decoration DwmStyle s) CircleEx Window
circleDwmStyle s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DwmStyle a
Dwm forall a. CircleEx a
circle
circleSimpleTabbed :: ModifiedLayout (Decoration TabBarDecoration DefaultShrinker) (ModifiedLayout ResizeScreen CircleEx) Window
circleSimpleTabbed :: ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen CircleEx)
Window
circleSimpleTabbed = forall a (l :: * -> *).
Eq a =>
l a
-> ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen l)
a
simpleTabBar forall a. CircleEx a
circle
circleTabbed :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration TabBarDecoration s) (ModifiedLayout ResizeScreen CircleEx) Window
circleTabbed :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration TabBarDecoration s)
(ModifiedLayout ResizeScreen CircleEx)
Window
circleTabbed s
s Theme
t = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar s
s Theme
t XPPosition
Top (forall (l :: * -> *) a.
Int -> l a -> ModifiedLayout ResizeScreen l a
resizeVertical (forall a b. (Integral a, Num b) => a -> b
fi forall a b. (a -> b) -> a -> b
$ Theme -> Dimension
decoHeight Theme
t) forall a. CircleEx a
circle)
accordionSimpleDefault :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker) Accordion Window
accordionSimpleDefault :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker) Accordion Window
accordionSimpleDefault = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration forall a. Accordion a
Accordion
accordionDefault :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) Accordion Window
accordionDefault :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) Accordion Window
accordionDefault s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration forall a. Accordion a
Accordion
accordionSimpleDeco :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker) Accordion Window
accordionSimpleDeco :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker) Accordion Window
accordionSimpleDeco = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) forall a. Accordion a
Accordion
accordionDeco :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) Accordion Window
accordionDeco :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) Accordion Window
accordionDeco s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) forall a. Accordion a
Accordion
accordionSimpleDefaultResizable :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Accordion)) Window
accordionSimpleDefaultResizable :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger Accordion))
Window
accordionSimpleDefaultResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. Accordion a
Accordion)
accordionDefaultResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Accordion)) Window
accordionDefaultResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger Accordion))
Window
accordionDefaultResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. Accordion a
Accordion)
accordionSimpleDecoResizable :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Accordion)) Window
accordionSimpleDecoResizable :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger Accordion))
Window
accordionSimpleDecoResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. Accordion a
Accordion)
accordionDecoResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Accordion)) Window
accordionDecoResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger Accordion))
Window
accordionDecoResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange forall a. Accordion a
Accordion)
accordionSimpleDwmStyle :: ModifiedLayout (Decoration DwmStyle DefaultShrinker) Accordion Window
accordionSimpleDwmStyle :: ModifiedLayout
(Decoration DwmStyle DefaultShrinker) Accordion Window
accordionSimpleDwmStyle = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DwmStyle a
Dwm forall a. Accordion a
Accordion
accordionDwmStyle :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DwmStyle s) Accordion Window
accordionDwmStyle :: forall s.
Shrinker s =>
s
-> Theme -> ModifiedLayout (Decoration DwmStyle s) Accordion Window
accordionDwmStyle s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DwmStyle a
Dwm forall a. Accordion a
Accordion
accordionSimpleTabbed :: ModifiedLayout (Decoration TabBarDecoration DefaultShrinker) (ModifiedLayout ResizeScreen Accordion) Window
accordionSimpleTabbed :: ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen Accordion)
Window
accordionSimpleTabbed = forall a (l :: * -> *).
Eq a =>
l a
-> ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen l)
a
simpleTabBar forall a. Accordion a
Accordion
accordionTabbed :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration TabBarDecoration s) (ModifiedLayout ResizeScreen Accordion) Window
accordionTabbed :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration TabBarDecoration s)
(ModifiedLayout ResizeScreen Accordion)
Window
accordionTabbed s
s Theme
t = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar s
s Theme
t XPPosition
Top (forall (l :: * -> *) a.
Int -> l a -> ModifiedLayout ResizeScreen l a
resizeVertical (forall a b. (Integral a, Num b) => a -> b
fi forall a b. (a -> b) -> a -> b
$ Theme -> Dimension
decoHeight Theme
t) forall a. Accordion a
Accordion)
tall :: Tall Window
tall :: Tall Window
tall = forall a. Int -> Rational -> Rational -> Tall a
Tall Int
1 (Rational
3forall a. Fractional a => a -> a -> a
/Rational
100) (Rational
1forall a. Fractional a => a -> a -> a
/Rational
2)
tallSimpleDefault :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker) Tall Window
tallSimpleDefault :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker) Tall Window
tallSimpleDefault = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration Tall Window
tall
tallDefault :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) Tall Window
tallDefault :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) Tall Window
tallDefault s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration Tall Window
tall
tallSimpleDeco :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker) Tall Window
tallSimpleDeco :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker) Tall Window
tallSimpleDeco = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) Tall Window
tall
tallDeco :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) Tall Window
tallDeco :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) Tall Window
tallDeco s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) Tall Window
tall
tallSimpleDefaultResizable :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall)) Window
tallSimpleDefaultResizable :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall))
Window
tallSimpleDefaultResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Tall Window
tall)
tallDefaultResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall)) Window
tallDefaultResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall))
Window
tallDefaultResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Tall Window
tall)
tallSimpleDecoResizable :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall)) Window
tallSimpleDecoResizable :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall))
Window
tallSimpleDecoResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Tall Window
tall)
tallDecoResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall)) Window
tallDecoResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger Tall))
Window
tallDecoResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Tall Window
tall)
tallSimpleDwmStyle :: ModifiedLayout (Decoration DwmStyle DefaultShrinker) Tall Window
tallSimpleDwmStyle :: ModifiedLayout (Decoration DwmStyle DefaultShrinker) Tall Window
tallSimpleDwmStyle = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DwmStyle a
Dwm Tall Window
tall
tallDwmStyle :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DwmStyle s) Tall Window
tallDwmStyle :: forall s.
Shrinker s =>
s -> Theme -> ModifiedLayout (Decoration DwmStyle s) Tall Window
tallDwmStyle s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DwmStyle a
Dwm Tall Window
tall
tallSimpleTabbed :: ModifiedLayout (Decoration TabBarDecoration DefaultShrinker) (ModifiedLayout ResizeScreen Tall) Window
tallSimpleTabbed :: ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen Tall)
Window
tallSimpleTabbed = forall a (l :: * -> *).
Eq a =>
l a
-> ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen l)
a
simpleTabBar Tall Window
tall
tallTabbed :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration TabBarDecoration s) (ModifiedLayout ResizeScreen Tall) Window
tallTabbed :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration TabBarDecoration s)
(ModifiedLayout ResizeScreen Tall)
Window
tallTabbed s
s Theme
t = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar s
s Theme
t XPPosition
Top (forall (l :: * -> *) a.
Int -> l a -> ModifiedLayout ResizeScreen l a
resizeVertical (forall a b. (Integral a, Num b) => a -> b
fi forall a b. (a -> b) -> a -> b
$ Theme -> Dimension
decoHeight Theme
t) Tall Window
tall)
mirrorTall :: Mirror Tall Window
mirrorTall :: Mirror Tall Window
mirrorTall = forall (l :: * -> *) a. l a -> Mirror l a
Mirror Tall Window
tall
mirrorTallSimpleDefault :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDefault :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDefault = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration Mirror Tall Window
mirrorTall
mirrorTallDefault :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s) (Mirror Tall) Window
mirrorTallDefault :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s) (Mirror Tall) Window
mirrorTallDefault s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration Mirror Tall Window
mirrorTall
mirrorTallSimpleDeco :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDeco :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDeco = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) Mirror Tall Window
mirrorTall
mirrorTallDeco :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s) (Mirror Tall) Window
mirrorTallDeco :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s) (Mirror Tall) Window
mirrorTallDeco s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) Mirror Tall Window
mirrorTall
mirrorTallSimpleDefaultResizable :: ModifiedLayout (Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger (Mirror Tall))) Window
mirrorTallSimpleDefaultResizable :: ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger (Mirror Tall)))
Window
mirrorTallSimpleDefaultResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Mirror Tall Window
mirrorTall)
mirrorTallDefaultResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger (Mirror Tall))) Window
mirrorTallDefaultResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger (Mirror Tall)))
Window
mirrorTallDefaultResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Mirror Tall Window
mirrorTall)
mirrorTallSimpleDecoResizable :: ModifiedLayout (Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger (Mirror Tall))) Window
mirrorTallSimpleDecoResizable :: ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger (Mirror Tall)))
Window
mirrorTallSimpleDecoResizable = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Mirror Tall Window
mirrorTall)
mirrorTallDecoResizable :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger (Mirror Tall))) Window
mirrorTallDecoResizable :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger (Mirror Tall)))
Window
mirrorTallDecoResizable s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t (forall a. Bool -> SimpleDecoration a
Simple Bool
True) (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrange Mirror Tall Window
mirrorTall)
mirrorTallSimpleDwmStyle :: ModifiedLayout (Decoration DwmStyle DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDwmStyle :: ModifiedLayout
(Decoration DwmStyle DefaultShrinker) (Mirror Tall) Window
mirrorTallSimpleDwmStyle = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DwmStyle a
Dwm Mirror Tall Window
mirrorTall
mirrorTallDwmStyle :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration DwmStyle s) (Mirror Tall) Window
mirrorTallDwmStyle :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout (Decoration DwmStyle s) (Mirror Tall) Window
mirrorTallDwmStyle s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DwmStyle a
Dwm Mirror Tall Window
mirrorTall
mirrorTallSimpleTabbed :: ModifiedLayout (Decoration TabBarDecoration DefaultShrinker) (ModifiedLayout ResizeScreen (Mirror Tall)) Window
mirrorTallSimpleTabbed :: ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen (Mirror Tall))
Window
mirrorTallSimpleTabbed = forall a (l :: * -> *).
Eq a =>
l a
-> ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout ResizeScreen l)
a
simpleTabBar Mirror Tall Window
mirrorTall
mirrorTallTabbed :: Shrinker s => s -> Theme
-> ModifiedLayout (Decoration TabBarDecoration s) (ModifiedLayout ResizeScreen (Mirror Tall)) Window
mirrorTallTabbed :: forall s.
Shrinker s =>
s
-> Theme
-> ModifiedLayout
(Decoration TabBarDecoration s)
(ModifiedLayout ResizeScreen (Mirror Tall))
Window
mirrorTallTabbed s
s Theme
t = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar s
s Theme
t XPPosition
Top (forall (l :: * -> *) a.
Int -> l a -> ModifiedLayout ResizeScreen l a
resizeVertical (forall a b. (Integral a, Num b) => a -> b
fi forall a b. (a -> b) -> a -> b
$ Theme -> Dimension
decoHeight Theme
t) Mirror Tall Window
mirrorTall)
floatSimpleSimple :: (Show a, Eq a) => ModifiedLayout (Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatSimpleSimple :: forall a.
(Show a, Eq a) =>
ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatSimpleSimple = forall a.
Eq a =>
ModifiedLayout
(Decoration SimpleDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
simpleFloat
floatSimple :: (Show a, Eq a, Shrinker s) => s -> Theme ->
ModifiedLayout (Decoration SimpleDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatSimple :: forall a s.
(Show a, Eq a, Shrinker s) =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatSimple = forall a s.
(Eq a, Shrinker s) =>
s
-> Theme
-> ModifiedLayout
(Decoration SimpleDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
simpleFloat'
floatSimpleDefault :: (Show a, Eq a) => ModifiedLayout (Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatSimpleDefault :: forall a.
(Show a, Eq a) =>
ModifiedLayout
(Decoration DefaultDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatSimpleDefault = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF Dimension
20)
floatDefault :: (Show a, Eq a, Shrinker s) => s -> Theme ->
ModifiedLayout (Decoration DefaultDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatDefault :: forall a s.
(Show a, Eq a, Shrinker s) =>
s
-> Theme
-> ModifiedLayout
(Decoration DefaultDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatDefault s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DefaultDecoration a
DefaultDecoration (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF (Theme -> Dimension
decoHeight Theme
t))
floatSimpleDwmStyle :: (Show a, Eq a) => ModifiedLayout (Decoration DwmStyle DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatSimpleDwmStyle :: forall a.
(Show a, Eq a) =>
ModifiedLayout
(Decoration DwmStyle DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatSimpleDwmStyle = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration DefaultShrinker
shrinkText forall a. Default a => a
def forall a. DwmStyle a
Dwm (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF Dimension
20)
floatDwmStyle :: (Show a, Eq a, Shrinker s) => s -> Theme ->
ModifiedLayout (Decoration DwmStyle s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatDwmStyle :: forall a s.
(Show a, Eq a, Shrinker s) =>
s
-> Theme
-> ModifiedLayout
(Decoration DwmStyle s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatDwmStyle s
s Theme
t = forall (ds :: * -> *) a s (l :: * -> *).
(DecorationStyle ds a, Shrinker s) =>
s -> Theme -> ds a -> l a -> ModifiedLayout (Decoration ds s) l a
decoration s
s Theme
t forall a. DwmStyle a
Dwm (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF (Theme -> Dimension
decoHeight Theme
t))
floatSimpleTabbed :: (Show a, Eq a) => ModifiedLayout (Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatSimpleTabbed :: forall a.
(Show a, Eq a) =>
ModifiedLayout
(Decoration TabBarDecoration DefaultShrinker)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatSimpleTabbed = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar DefaultShrinker
shrinkText forall a. Default a => a
def XPPosition
Top (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF Dimension
20)
floatTabbed :: (Show a, Eq a, Shrinker s) => s -> Theme ->
ModifiedLayout (Decoration TabBarDecoration s)
(ModifiedLayout MouseResize (ModifiedLayout WindowArranger SimpleFloat)) a
floatTabbed :: forall a s.
(Show a, Eq a, Shrinker s) =>
s
-> Theme
-> ModifiedLayout
(Decoration TabBarDecoration s)
(ModifiedLayout
MouseResize (ModifiedLayout WindowArranger SimpleFloat))
a
floatTabbed s
s Theme
t = forall a s (l :: * -> *).
(Eq a, Shrinker s) =>
s
-> Theme
-> XPPosition
-> l a
-> ModifiedLayout (Decoration TabBarDecoration s) l a
tabBar s
s Theme
t XPPosition
Top (forall (l :: * -> *) a. l a -> ModifiedLayout MouseResize l a
mouseResize forall a b. (a -> b) -> a -> b
$ forall (l :: * -> *) a. l a -> ModifiedLayout WindowArranger l a
windowArrangeAll forall a b. (a -> b) -> a -> b
$ forall a. Dimension -> SimpleFloat a
SF (Theme -> Dimension
decoHeight Theme
t))