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

Safe HaskellNone
LanguageHaskell2010

DzenDhall.Data

Documentation

data Bar id Source #

Instances
Eq (Bar Marshalled) Source # 
Instance details

Defined in DzenDhall.Data

Show (Bar Marshalled) Source # 
Instance details

Defined in DzenDhall.Data

Generic (Bar id) Source # 
Instance details

Defined in DzenDhall.Data

Associated Types

type Rep (Bar id) :: Type -> Type #

Methods

from :: Bar id -> Rep (Bar id) x #

to :: Rep (Bar id) x -> Bar id #

Semigroup (Bar id) Source # 
Instance details

Defined in DzenDhall.Data

Methods

(<>) :: Bar id -> Bar id -> Bar id #

sconcat :: NonEmpty (Bar id) -> Bar id #

stimes :: Integral b => b -> Bar id -> Bar id #

Monoid (Bar id) Source # 
Instance details

Defined in DzenDhall.Data

Methods

mempty :: Bar id #

mappend :: Bar id -> Bar id -> Bar id #

mconcat :: [Bar id] -> Bar id #

type Rep (Bar id) Source # 
Instance details

Defined in DzenDhall.Data

type Rep (Bar id) = D1 (MetaData "Bar" "DzenDhall.Data" "dzen-dhall-1.0.2-1DjeyjLENUgKHKuAgVFJmg" False) (((C1 (MetaCons "BarAutomaton" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StateTransitionTableX id)) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (AutomataRefX id (Bar id))))) :+: (C1 (MetaCons "BarPad" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Padding) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bar id)))) :+: C1 (MetaCons "BarTrim" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Direction) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bar id)))))) :+: (C1 (MetaCons "BarMarquee" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Marquee) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bar id))) :+: (C1 (MetaCons "BarProp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Property) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bar id))) :+: C1 (MetaCons "BarMarkup" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))))) :+: ((C1 (MetaCons "BarScope" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bar id))) :+: (C1 (MetaCons "BarShape" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Shape)) :+: C1 (MetaCons "BarSlider" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Slider) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector (Bar id)))))) :+: ((C1 (MetaCons "BarSource" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SourceRefX id))) :+: C1 (MetaCons "BarText" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))) :+: (C1 (MetaCons "BarDefine" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Variable)) :+: C1 (MetaCons "Bars" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Bar id]))))))

type family AutomataRefX id :: * -> * Source #

Instances
type AutomataRefX Marshalled Source # 
Instance details

Defined in DzenDhall.Data

type AutomataRefX Initialized Source # 
Instance details

Defined in DzenDhall.Data

type family SourceRefX id Source #

Instances
type SourceRefX Marshalled Source # 
Instance details

Defined in DzenDhall.Data

type SourceRefX Initialized Source # 
Instance details

Defined in DzenDhall.Data

newtype Initialized Source #

Constructors

Initialized Void 
Instances
type SourceRefX Initialized Source # 
Instance details

Defined in DzenDhall.Data

type StateTransitionTableX Initialized Source # 
Instance details

Defined in DzenDhall.Data

type AutomataRefX Initialized Source # 
Instance details

Defined in DzenDhall.Data

data Property Source #

Instances
Eq Property Source # 
Instance details

Defined in DzenDhall.Data

Show Property Source # 
Instance details

Defined in DzenDhall.Data

Generic Property Source # 
Instance details

Defined in DzenDhall.Data

Associated Types

type Rep Property :: Type -> Type #

Methods

from :: Property -> Rep Property x #

to :: Rep Property x -> Property #

type Rep Property Source # 
Instance details

Defined in DzenDhall.Data

data Shape Source #

Constructors

I ImagePath 
R Int Int 
RO Int Int 
C Int 
CO Int 
Instances
Eq Shape Source # 
Instance details

Defined in DzenDhall.Data

Methods

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

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

Show Shape Source # 
Instance details

Defined in DzenDhall.Data

Methods

showsPrec :: Int -> Shape -> ShowS #

show :: Shape -> String #

showList :: [Shape] -> ShowS #

Generic Shape Source # 
Instance details

Defined in DzenDhall.Data

Associated Types

type Rep Shape :: Type -> Type #

Methods

from :: Shape -> Rep Shape x #

to :: Rep Shape x -> Shape #

Renderable Shape Source # 
Instance details

Defined in DzenDhall.AST.Render

Methods

render :: Shape -> Render () Source #

type Rep Shape Source # 
Instance details

Defined in DzenDhall.Data