dzen-dhall-1.0.2: Configure dzen2 bars in Dhall language

Safe HaskellNone
LanguageHaskell2010

DzenDhall.Config

Description

Data types for marshalling dhall configs into Haskell.

Synopsis

Documentation

data Marquee Source #

Constructors

Marquee 
Instances
Eq Marquee Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Marquee -> Marquee -> Bool #

(/=) :: Marquee -> Marquee -> Bool #

Show Marquee Source # 
Instance details

Defined in DzenDhall.Config

Generic Marquee Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Marquee :: Type -> Type #

Methods

from :: Marquee -> Rep Marquee x #

to :: Rep Marquee x -> Marquee #

type Rep Marquee Source # 
Instance details

Defined in DzenDhall.Config

type Rep Marquee = D1 (MetaData "Marquee" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Marquee" PrefixI True) (S1 (MetaSel (Just "_mqFramesPerChar") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: (S1 (MetaSel (Just "_mqWidth") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "_mqShouldWrap") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool))))

data Direction Source #

Constructors

DLeft 
DRight 
Instances
Eq Direction Source # 
Instance details

Defined in DzenDhall.Config

Show Direction Source # 
Instance details

Defined in DzenDhall.Config

Generic Direction Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Direction :: Type -> Type #

type Rep Direction Source # 
Instance details

Defined in DzenDhall.Config

type Rep Direction = D1 (MetaData "Direction" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "DLeft" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DRight" PrefixI False) (U1 :: Type -> Type))

data VerticalDirection Source #

Constructors

VUp 
VDown 
Instances
Eq VerticalDirection Source # 
Instance details

Defined in DzenDhall.Config

Show VerticalDirection Source # 
Instance details

Defined in DzenDhall.Config

Generic VerticalDirection Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep VerticalDirection :: Type -> Type #

type Rep VerticalDirection Source # 
Instance details

Defined in DzenDhall.Config

type Rep VerticalDirection = D1 (MetaData "VerticalDirection" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "VUp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "VDown" PrefixI False) (U1 :: Type -> Type))

data Assertion Source #

Instances
Eq Assertion Source # 
Instance details

Defined in DzenDhall.Config

Show Assertion Source # 
Instance details

Defined in DzenDhall.Config

Generic Assertion Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Assertion :: Type -> Type #

type Rep Assertion Source # 
Instance details

Defined in DzenDhall.Config

type Rep Assertion = D1 (MetaData "Assertion" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "BinaryInPath" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: C1 (MetaCons "SuccessfulExit" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data Check Source #

Constructors

Check 
Instances
Eq Check Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Check -> Check -> Bool #

(/=) :: Check -> Check -> Bool #

Show Check Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Check -> ShowS #

show :: Check -> String #

showList :: [Check] -> ShowS #

Generic Check Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Check :: Type -> Type #

Methods

from :: Check -> Rep Check x #

to :: Rep Check x -> Check #

type Rep Check Source # 
Instance details

Defined in DzenDhall.Config

type Rep Check = D1 (MetaData "Check" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Check" PrefixI True) (S1 (MetaSel (Just "_chMessage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "_chAssertion") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Assertion)))

data Button Source #

Instances
Eq Button Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Button -> Button -> Bool #

(/=) :: Button -> Button -> Bool #

Ord Button Source # 
Instance details

Defined in DzenDhall.Config

Show Button Source # 
Instance details

Defined in DzenDhall.Config

Generic Button Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Button :: Type -> Type #

Methods

from :: Button -> Rep Button x #

to :: Rep Button x -> Button #

Hashable Button Source # 
Instance details

Defined in DzenDhall.Config

Methods

hashWithSalt :: Int -> Button -> Int #

hash :: Button -> Int #

Renderable Button Source # 
Instance details

Defined in DzenDhall.AST.Render

Methods

render :: Button -> Render () Source #

type Rep Button Source # 
Instance details

Defined in DzenDhall.Config

type Rep Button = D1 (MetaData "Button" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) ((C1 (MetaCons "MouseLeft" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "MouseMiddle" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MouseRight" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "MouseScrollUp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MouseScrollDown" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "MouseScrollLeft" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MouseScrollRight" PrefixI False) (U1 :: Type -> Type))))

newtype Event Source #

Constructors

Event Text 
Instances
Eq Event Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Ord Event Source # 
Instance details

Defined in DzenDhall.Config

Methods

compare :: Event -> Event -> Ordering #

(<) :: Event -> Event -> Bool #

(<=) :: Event -> Event -> Bool #

(>) :: Event -> Event -> Bool #

(>=) :: Event -> Event -> Bool #

max :: Event -> Event -> Event #

min :: Event -> Event -> Event #

Show Event Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Generic Event Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

Hashable Event Source # 
Instance details

Defined in DzenDhall.Config

Methods

hashWithSalt :: Int -> Event -> Int #

hash :: Event -> Int #

Renderable Event Source # 
Instance details

Defined in DzenDhall.AST.Render

Methods

render :: Event -> Render () Source #

type Rep Event Source # 
Instance details

Defined in DzenDhall.Config

type Rep Event = D1 (MetaData "Event" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" True) (C1 (MetaCons "Event" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data Fade Source #

Instances
Eq Fade Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Fade -> Fade -> Bool #

(/=) :: Fade -> Fade -> Bool #

Show Fade Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Fade -> ShowS #

show :: Fade -> String #

showList :: [Fade] -> ShowS #

Generic Fade Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Fade :: Type -> Type #

Methods

from :: Fade -> Rep Fade x #

to :: Rep Fade x -> Fade #

type Rep Fade Source # 
Instance details

Defined in DzenDhall.Config

type Rep Fade = D1 (MetaData "Fade" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Fade" PrefixI True) (S1 (MetaSel (Just "_fadeDirection") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 VerticalDirection) :*: (S1 (MetaSel (Just "_fadeFrameCount") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "_fadePixelHeight") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))))

data Slider Source #

Constructors

Slider 
Instances
Eq Slider Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Slider -> Slider -> Bool #

(/=) :: Slider -> Slider -> Bool #

Show Slider Source # 
Instance details

Defined in DzenDhall.Config

Generic Slider Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Slider :: Type -> Type #

Methods

from :: Slider -> Rep Slider x #

to :: Rep Slider x -> Slider #

type Rep Slider Source # 
Instance details

Defined in DzenDhall.Config

type Rep Slider = D1 (MetaData "Slider" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Slider" PrefixI True) (S1 (MetaSel (Just "_fadeIn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Fade) :*: (S1 (MetaSel (Just "_fadeOut") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Fade) :*: S1 (MetaSel (Just "_sliderDelay") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))))

data Hook Source #

Constructors

Hook 

Fields

Instances
Eq Hook Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Hook -> Hook -> Bool #

(/=) :: Hook -> Hook -> Bool #

Show Hook Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Hook -> ShowS #

show :: Hook -> String #

showList :: [Hook] -> ShowS #

Generic Hook Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Hook :: Type -> Type #

Methods

from :: Hook -> Rep Hook x #

to :: Rep Hook x -> Hook #

type Rep Hook Source # 
Instance details

Defined in DzenDhall.Config

type Rep Hook = D1 (MetaData "Hook" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Hook" PrefixI True) (S1 (MetaSel (Just "_hookCommand") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Text]) :*: S1 (MetaSel (Just "_hookInput") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype Color Source #

Constructors

Color Text 
Instances
Eq Color Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Show Color Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Generic Color Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Color :: Type -> Type #

Methods

from :: Color -> Rep Color x #

to :: Rep Color x -> Color #

Renderable Color Source # 
Instance details

Defined in DzenDhall.AST.Render

Methods

render :: Color -> Render () Source #

type Rep Color Source # 
Instance details

Defined in DzenDhall.Config

type Rep Color = D1 (MetaData "Color" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" True) (C1 (MetaCons "Color" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data AbsolutePosition Source #

Constructors

AbsolutePosition 

Fields

Instances
Eq AbsolutePosition Source # 
Instance details

Defined in DzenDhall.Config

Show AbsolutePosition Source # 
Instance details

Defined in DzenDhall.Config

Generic AbsolutePosition Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep AbsolutePosition :: Type -> Type #

Renderable AbsolutePosition Source # 
Instance details

Defined in DzenDhall.AST.Render

type Rep AbsolutePosition Source # 
Instance details

Defined in DzenDhall.Config

type Rep AbsolutePosition = D1 (MetaData "AbsolutePosition" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "AbsolutePosition" PrefixI True) (S1 (MetaSel (Just "_apX") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "_apY") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

data Position Source #

Specify position that will be passed to ^p().

Constructors

XY (Int, Int)

^p(+-X;+-Y) - move X pixels to the right or left and Y pixels up or down of the current position (on the X and Y axis).

P_RESET_Y

^p() - Reset the Y position to its default.

P_LOCK_X

_LOCK_X - Lock the current X position, useful if you want to align things vertically

P_UNLOCK_X

_UNLOCK_X - Unlock the X position

P_LEFT

_LEFT - Move current x-position to the left edge

P_RIGHT

_RIGHT - Move current x-position to the right edge

P_TOP

_TOP - Move current y-position to the top edge

P_CENTER

_CENTER - Move current x-position to the center of the window

P_BOTTOM

_BOTTOM - Move current y-position to the bottom edge

Instances
Eq Position Source # 
Instance details

Defined in DzenDhall.Config

Show Position Source # 
Instance details

Defined in DzenDhall.Config

Generic Position Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Position :: Type -> Type #

Methods

from :: Position -> Rep Position x #

to :: Rep Position x -> Position #

type Rep Position Source # 
Instance details

Defined in DzenDhall.Config

type Rep Position = D1 (MetaData "Position" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (((C1 (MetaCons "XY" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Int, Int))) :+: C1 (MetaCons "P_RESET_Y" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "P_LOCK_X" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "P_UNLOCK_X" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "P_LEFT" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "P_RIGHT" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "P_TOP" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "P_CENTER" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "P_BOTTOM" PrefixI False) (U1 :: Type -> Type)))))

data ClickableArea Source #

Constructors

ClickableArea 
Instances
Eq ClickableArea Source # 
Instance details

Defined in DzenDhall.Config

Show ClickableArea Source # 
Instance details

Defined in DzenDhall.Config

Generic ClickableArea Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep ClickableArea :: Type -> Type #

Renderable ClickableArea Source # 
Instance details

Defined in DzenDhall.AST.Render

type Rep ClickableArea Source # 
Instance details

Defined in DzenDhall.Config

type Rep ClickableArea = D1 (MetaData "ClickableArea" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "ClickableArea" PrefixI True) (S1 (MetaSel (Just "_caButton") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Button) :*: S1 (MetaSel (Just "_caCommand") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data Padding Source #

Constructors

PLeft 
PRight 
PSides 
Instances
Eq Padding Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Padding -> Padding -> Bool #

(/=) :: Padding -> Padding -> Bool #

Show Padding Source # 
Instance details

Defined in DzenDhall.Config

Generic Padding Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Padding :: Type -> Type #

Methods

from :: Padding -> Rep Padding x #

to :: Rep Padding x -> Padding #

type Rep Padding Source # 
Instance details

Defined in DzenDhall.Config

type Rep Padding = D1 (MetaData "Padding" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "PLeft" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PRight" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PSides" PrefixI False) (U1 :: Type -> Type)))

data OpeningTag Source #

Instances
Eq OpeningTag Source # 
Instance details

Defined in DzenDhall.Config

Show OpeningTag Source # 
Instance details

Defined in DzenDhall.Config

Generic OpeningTag Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep OpeningTag :: Type -> Type #

type Rep OpeningTag Source # 
Instance details

Defined in DzenDhall.Config

type Rep OpeningTag = D1 (MetaData "OpeningTag" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (((C1 (MetaCons "OMarquee" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Marquee)) :+: (C1 (MetaCons "OSlider" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Slider)) :+: C1 (MetaCons "OFG" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Color)))) :+: (C1 (MetaCons "OBG" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Color)) :+: (C1 (MetaCons "OP" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Position)) :+: C1 (MetaCons "OPA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 AbsolutePosition))))) :+: ((C1 (MetaCons "OCA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ClickableArea)) :+: (C1 (MetaCons "OIB" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OPadding" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Padding)))) :+: ((C1 (MetaCons "OTrim" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Direction)) :+: C1 (MetaCons "OAutomaton" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 AutomatonAddress) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 StateTransitionTable))) :+: (C1 (MetaCons "OStateMapKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: C1 (MetaCons "OScope" PrefixI False) (U1 :: Type -> Type)))))

data BarSettings Source #

Constructors

BarSettings 

Fields

Instances
Eq BarSettings Source # 
Instance details

Defined in DzenDhall.Config

Show BarSettings Source # 
Instance details

Defined in DzenDhall.Config

Generic BarSettings Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep BarSettings :: Type -> Type #

type Rep BarSettings Source # 
Instance details

Defined in DzenDhall.Config

data ShapeSize Source #

Constructors

ShapeSize 
Instances
Eq ShapeSize Source # 
Instance details

Defined in DzenDhall.Config

Show ShapeSize Source # 
Instance details

Defined in DzenDhall.Config

Generic ShapeSize Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep ShapeSize :: Type -> Type #

type Rep ShapeSize Source # 
Instance details

Defined in DzenDhall.Config

type Rep ShapeSize = D1 (MetaData "ShapeSize" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "ShapeSize" PrefixI True) (S1 (MetaSel (Just "_shapeSizeW") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "_shapeSizeH") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

data Variable Source #

Constructors

Variable 

Fields

Instances
Eq Variable Source # 
Instance details

Defined in DzenDhall.Config

Show Variable Source # 
Instance details

Defined in DzenDhall.Config

Generic Variable Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Variable :: Type -> Type #

Methods

from :: Variable -> Rep Variable x #

to :: Rep Variable x -> Variable #

type Rep Variable Source # 
Instance details

Defined in DzenDhall.Config

type Rep Variable = D1 (MetaData "Variable" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Variable" PrefixI True) (S1 (MetaSel (Just "_varName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "_varValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data Token Source #

Instances
Eq Token Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

Show Token Source # 
Instance details

Defined in DzenDhall.Config

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Generic Token Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Token :: Type -> Type #

Methods

from :: Token -> Rep Token x #

to :: Rep Token x -> Token #

type Rep Token Source # 
Instance details

Defined in DzenDhall.Config

type Rep Token = D1 (MetaData "Token" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (((C1 (MetaCons "TokOpen" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 OpeningTag)) :+: (C1 (MetaCons "TokClose" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TokSeparator" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "TokTxt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: (C1 (MetaCons "TokSource" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Source)) :+: C1 (MetaCons "TokMarkup" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))))) :+: ((C1 (MetaCons "TokI" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: (C1 (MetaCons "TokR" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ShapeSize)) :+: C1 (MetaCons "TokRO" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ShapeSize)))) :+: ((C1 (MetaCons "TokC" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) :+: C1 (MetaCons "TokCO" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))) :+: (C1 (MetaCons "TokCheck" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Check)) :+: C1 (MetaCons "TokDefine" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Variable))))))

data Source Source #

Constructors

Source 

Fields

Instances
Eq Source Source # 
Instance details

Defined in DzenDhall.Config

Methods

(==) :: Source -> Source -> Bool #

(/=) :: Source -> Source -> Bool #

Show Source Source # 
Instance details

Defined in DzenDhall.Config

Generic Source Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Source :: Type -> Type #

Methods

from :: Source -> Rep Source x #

to :: Rep Source x -> Source #

Hashable Source Source # 
Instance details

Defined in DzenDhall.Config

Methods

hashWithSalt :: Int -> Source -> Int #

hash :: Source -> Int #

type Rep Source Source # 
Instance details

Defined in DzenDhall.Config

data Configuration Source #

Instances
Eq Configuration Source # 
Instance details

Defined in DzenDhall.Config

Show Configuration Source # 
Instance details

Defined in DzenDhall.Config

Generic Configuration Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep Configuration :: Type -> Type #

type Rep Configuration Source # 
Instance details

Defined in DzenDhall.Config

type Rep Configuration = D1 (MetaData "Configuration" "DzenDhall.Config" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (C1 (MetaCons "Configuration" PrefixI True) (S1 (MetaSel (Just "_cfgBarTokens") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Token]) :*: S1 (MetaSel (Just "_cfgBarSettings") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BarSettings)))

data PluginMeta Source #

Instances
Eq PluginMeta Source # 
Instance details

Defined in DzenDhall.Config

Show PluginMeta Source # 
Instance details

Defined in DzenDhall.Config

Generic PluginMeta Source # 
Instance details

Defined in DzenDhall.Config

Associated Types

type Rep PluginMeta :: Type -> Type #

type Rep PluginMeta Source # 
Instance details

Defined in DzenDhall.Config