Mondrian-0.1.0.0: Renders backgrounds & borders
Safe HaskellNone
LanguageHaskell2010

Graphics.Rendering.Rect.Backgrounds

Documentation

data Backgrounds img Source #

Constructors

Backgrounds 

Fields

Instances

Instances details
Eq img => Eq (Backgrounds img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: Backgrounds img -> Backgrounds img -> Bool

(/=) :: Backgrounds img -> Backgrounds img -> Bool

Read img => Read (Backgrounds img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS (Backgrounds img)

readList :: ReadS [Backgrounds img]

readPrec :: ReadPrec (Backgrounds img)

readListPrec :: ReadPrec [Backgrounds img]

Show img => Show (Backgrounds img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> Backgrounds img -> ShowS

show :: Backgrounds img -> String

showList :: [Backgrounds img] -> ShowS

PropertyParser (Backgrounds Text) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

data Pattern img Source #

Constructors

None 
Img img 
Linear Float [(C, Length)] 
Radial RadialShape Extent (Length, Length) [(C, Length)] 
Conical Float (Length, Length) [(C, Length)] 

Instances

Instances details
Eq img => Eq (Pattern img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: Pattern img -> Pattern img -> Bool

(/=) :: Pattern img -> Pattern img -> Bool

Read img => Read (Pattern img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS (Pattern img)

readList :: ReadS [Pattern img]

readPrec :: ReadPrec (Pattern img)

readListPrec :: ReadPrec [Pattern img]

Show img => Show (Pattern img) Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> Pattern img -> ShowS

show :: Pattern img -> String

showList :: [Pattern img] -> ShowS

data RadialShape Source #

Constructors

Circle 
Ellipse 

Instances

Instances details
Eq RadialShape Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: RadialShape -> RadialShape -> Bool

(/=) :: RadialShape -> RadialShape -> Bool

Read RadialShape Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS RadialShape

readList :: ReadS [RadialShape]

readPrec :: ReadPrec RadialShape

readListPrec :: ReadPrec [RadialShape]

Show RadialShape Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> RadialShape -> ShowS

show :: RadialShape -> String

showList :: [RadialShape] -> ShowS

data Resize Source #

Constructors

Cover 
Contain 
Size Length Length 

Instances

Instances details
Eq Resize Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: Resize -> Resize -> Bool

(/=) :: Resize -> Resize -> Bool

Read Resize Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS Resize

readList :: ReadS [Resize]

readPrec :: ReadPrec Resize

readListPrec :: ReadPrec [Resize]

Show Resize Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> Resize -> ShowS

show :: Resize -> String

showList :: [Resize] -> ShowS

data Length Source #

Constructors

Absolute Float 
Scale Float 
Auto 

Instances

Instances details
Eq Length Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: Length -> Length -> Bool

(/=) :: Length -> Length -> Bool

Read Length Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS Length

readList :: ReadS [Length]

readPrec :: ReadPrec Length

readListPrec :: ReadPrec [Length]

Show Length Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> Length -> ShowS

show :: Length -> String

showList :: [Length] -> ShowS

data Extent Source #

Instances

Instances details
Eq Extent Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

(==) :: Extent -> Extent -> Bool

(/=) :: Extent -> Extent -> Bool

Read Extent Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

readsPrec :: Int -> ReadS Extent

readList :: ReadS [Extent]

readPrec :: ReadPrec Extent

readListPrec :: ReadPrec [Extent]

Show Extent Source # 
Instance details

Defined in Graphics.Rendering.Rect.CSS.Backgrounds

Methods

showsPrec :: Int -> Extent -> ShowS

show :: Extent -> String

showList :: [Extent] -> ShowS

resolveSize :: (Float, Float) -> (Float, Float) -> Resize -> (Float, Float) Source #

renderBackgrounds :: (MonadIO m, MonadIO n) => n (Backgrounds Texture -> Rects -> M44 Float -> m ()) Source #