reanimate-svg-0.10.3.0: SVG file loader and serializer

Safe HaskellNone
LanguageHaskell2010

Graphics.SvgTree.Types

Contents

Description

This module define all the types used in the definition of a svg scene.

Most of the types are lensified.

Synopsis

Basic building types

type Coord = Double Source #

Basic coordinate type.

data Origin Source #

Tell if a path command is absolute (in the current user coordiante) or relative to the previous poitn.

Constructors

OriginAbsolute

Next point in absolute coordinate

OriginRelative

Next point relative to the previous

Instances
Eq Origin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Origin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Origin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Origin :: Type -> Type #

Methods

from :: Origin -> Rep Origin x #

to :: Rep Origin x -> Origin #

Hashable Origin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Origin -> Int #

hash :: Origin -> Int #

type Rep Origin Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Origin = D1 (MetaData "Origin" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "OriginAbsolute" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OriginRelative" PrefixI False) (U1 :: Type -> Type))

type Point = (Number, Number) Source #

Possibly context dependant point.

type RPoint = V2 Coord Source #

Real Point, fully determined and not dependant of the rendering context.

data PathCommand Source #

Path command definition.

Constructors

MoveTo !Origin ![RPoint]

M or m command

LineTo !Origin ![RPoint]

Line to, L or l Svg path command.

HorizontalTo !Origin ![Coord]

Equivalent to the H or h svg path command.

VerticalTo !Origin ![Coord]

Equivalent to the V or v svg path command.

CurveTo !Origin ![(RPoint, RPoint, RPoint)]

Cubic bezier, C or c command

SmoothCurveTo !Origin ![(RPoint, RPoint)]

Smooth cubic bezier, equivalent to S or s command

QuadraticBezier !Origin ![(RPoint, RPoint)]

Quadratic bezier, Q or q command

SmoothQuadraticBezierCurveTo !Origin ![RPoint]

Quadratic bezier, T or t command

EllipticalArc !Origin ![(Coord, Coord, Coord, Bool, Bool, RPoint)]

Eliptical arc, A or a command.

EndPath

Close the path, Z or z svg path command.

Instances
Eq PathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show PathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic PathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep PathCommand :: Type -> Type #

Hashable PathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PathCommand = D1 (MetaData "PathCommand" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (((C1 (MetaCons "MoveTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [RPoint])) :+: C1 (MetaCons "LineTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [RPoint]))) :+: (C1 (MetaCons "HorizontalTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Coord])) :+: (C1 (MetaCons "VerticalTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Coord])) :+: C1 (MetaCons "CurveTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [(RPoint, RPoint, RPoint)]))))) :+: ((C1 (MetaCons "SmoothCurveTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [(RPoint, RPoint)])) :+: C1 (MetaCons "QuadraticBezier" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [(RPoint, RPoint)]))) :+: (C1 (MetaCons "SmoothQuadraticBezierCurveTo" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [RPoint])) :+: (C1 (MetaCons "EllipticalArc" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Origin) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [(Coord, Coord, Coord, Bool, Bool, RPoint)])) :+: C1 (MetaCons "EndPath" PrefixI False) (U1 :: Type -> Type)))))

data Transformation Source #

Describe the content of the transformation attribute. see _transform and transform.

Constructors

TransformMatrix !Coord !Coord !Coord !Coord !Coord !Coord

Directly encode the translation matrix.

Translate !Double !Double

Translation along a vector

Scale !Double !(Maybe Double)

Scaling on both axis or on X axis and Y axis.

Rotate !Double !(Maybe (Double, Double))

Rotation around `(0, 0)` or around an optional point.

SkewX !Double

Skew transformation along the X axis.

SkewY !Double

Skew transformation along the Y axis.

TransformUnknown

Unkown transformation, like identity.

Instances
Eq Transformation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Transformation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Transformation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Transformation :: Type -> Type #

Hashable Transformation Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Transformation Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Transformation = D1 (MetaData "Transformation" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((C1 (MetaCons "TransformMatrix" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord))) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Coord)))) :+: (C1 (MetaCons "Translate" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double)) :+: C1 (MetaCons "Scale" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double))))) :+: ((C1 (MetaCons "Rotate" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Double, Double)))) :+: C1 (MetaCons "SkewX" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double))) :+: (C1 (MetaCons "SkewY" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Double)) :+: C1 (MetaCons "TransformUnknown" PrefixI False) (U1 :: Type -> Type))))

data ElementRef Source #

Correspond to the possible values of the the attributes which are either none or `url(#elem)`

Constructors

RefNone

Value for none

Ref String

Equivalent to `url()` attribute.

Instances
Eq ElementRef Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show ElementRef Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic ElementRef Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep ElementRef :: Type -> Type #

Hashable ElementRef Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ElementRef Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ElementRef = D1 (MetaData "ElementRef" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "RefNone" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ref" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)))

data CoordinateUnits Source #

Define the possible values of various *units attributes used in the definition of the gradients and masks.

Constructors

CoordUserSpace

userSpaceOnUse value

CoordBoundingBox

objectBoundingBox value

Instances
Eq CoordinateUnits Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show CoordinateUnits Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic CoordinateUnits Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep CoordinateUnits :: Type -> Type #

Hashable CoordinateUnits Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep CoordinateUnits Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep CoordinateUnits = D1 (MetaData "CoordinateUnits" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "CoordUserSpace" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CoordBoundingBox" PrefixI False) (U1 :: Type -> Type))

Building helpers

toPoint :: Number -> Number -> Point Source #

Little helper function to build a point.

serializeNumber :: Number -> String Source #

Encode the number to string which can be used in a CSS or a svg attributes.

serializeTransformation :: Transformation -> String Source #

Convert the Transformation to a string which can be directly used in a svg attributes.

serializeTransformations :: [Transformation] -> String Source #

Transform a list of transformations to a string for svg transform attributes.

Drawing control types

data Cap Source #

Describe how the line should be terminated when stroking them. Describe the values of the `stroke-linecap` attribute. See _strokeLineCap

Constructors

CapRound

End with a round (round value)

CapButt

Define straight just at the end (butt value)

CapSquare

Straight further of the ends (square value)

Instances
Eq Cap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Cap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Cap -> ShowS #

show :: Cap -> String #

showList :: [Cap] -> ShowS #

Generic Cap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Cap :: Type -> Type #

Methods

from :: Cap -> Rep Cap x #

to :: Rep Cap x -> Cap #

Hashable Cap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Cap -> Int #

hash :: Cap -> Int #

type Rep Cap Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Cap = D1 (MetaData "Cap" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "CapRound" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CapButt" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CapSquare" PrefixI False) (U1 :: Type -> Type)))

data LineJoin Source #

Define the possible values of the `stroke-linejoin` attribute. see _strokeLineJoin

Constructors

JoinMiter

miter value

JoinBevel

bevel value

JoinRound

round value

Instances
Eq LineJoin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show LineJoin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic LineJoin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep LineJoin :: Type -> Type #

Methods

from :: LineJoin -> Rep LineJoin x #

to :: Rep LineJoin x -> LineJoin #

Hashable LineJoin Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> LineJoin -> Int #

hash :: LineJoin -> Int #

type Rep LineJoin Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep LineJoin = D1 (MetaData "LineJoin" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "JoinMiter" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "JoinBevel" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "JoinRound" PrefixI False) (U1 :: Type -> Type)))

data Tree Source #

Main type for the scene description, reorient to specific type describing each tag.

Instances
Eq Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Tree -> ShowS #

show :: Tree -> String #

showList :: [Tree] -> ShowS #

Generic Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Tree :: Type -> Type #

Methods

from :: Tree -> Rep Tree x #

to :: Rep Tree x -> Tree #

Hashable Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Tree -> Int #

hash :: Tree -> Int #

CssMatcheable Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Tree = D1 (MetaData "Tree" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((((C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UseTree" PrefixI True) (S1 (MetaSel (Just "useInformation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Use) :*: S1 (MetaSel (Just "useSubTree") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Tree)))) :+: (C1 (MetaCons "GroupTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Group Tree))) :+: (C1 (MetaCons "SymbolTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Symbol Tree))) :+: C1 (MetaCons "DefinitionTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Definitions Tree)))))) :+: ((C1 (MetaCons "FilterTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Filter)) :+: (C1 (MetaCons "PathTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Path)) :+: C1 (MetaCons "CircleTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Circle)))) :+: (C1 (MetaCons "PolyLineTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 PolyLine)) :+: (C1 (MetaCons "PolygonTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Polygon)) :+: C1 (MetaCons "EllipseTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Ellipse)))))) :+: (((C1 (MetaCons "LineTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Line)) :+: (C1 (MetaCons "RectangleTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Rectangle)) :+: C1 (MetaCons "TextTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextPath)) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))) :+: (C1 (MetaCons "ImageTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Image)) :+: (C1 (MetaCons "LinearGradientTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 LinearGradient)) :+: C1 (MetaCons "RadialGradientTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 RadialGradient))))) :+: ((C1 (MetaCons "MeshGradientTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 MeshGradient)) :+: (C1 (MetaCons "PatternTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Pattern)) :+: C1 (MetaCons "MarkerTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Marker)))) :+: (C1 (MetaCons "MaskTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Mask)) :+: (C1 (MetaCons "ClipPathTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ClipPath)) :+: C1 (MetaCons "SvgTree" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Document)))))))

data Number Source #

Encode complex number possibly dependant to the current render size.

Constructors

Num Double

Simple coordinate in current user coordinate.

Px Double

With suffix "px"

Em Double

Number relative to the current font size.

Percent Double

Number relative to the current viewport size.

Pc Double 
Mm Double

Number in millimeters, relative to DPI.

Cm Double

Number in centimeters, relative to DPI.

Point Double

Number in points, relative to DPI.

Inches Double

Number in inches, relative to DPI.

Instances
Eq Number Source # 
Instance details

Defined in Graphics.SvgTree.CssTypes

Methods

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

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

Show Number Source # 
Instance details

Defined in Graphics.SvgTree.CssTypes

Generic Number Source # 
Instance details

Defined in Graphics.SvgTree.CssTypes

Associated Types

type Rep Number :: Type -> Type #

Methods

from :: Number -> Rep Number x #

to :: Rep Number x -> Number #

Hashable Number Source # 
Instance details

Defined in Graphics.SvgTree.CssTypes

Methods

hashWithSalt :: Int -> Number -> Int #

hash :: Number -> Int #

type Rep Number Source # 
Instance details

Defined in Graphics.SvgTree.CssTypes

data Spread Source #

Define the possible values for the spreadMethod values used for the gradient definitions.

Constructors

SpreadRepeat

reapeat value

SpreadPad

pad value

SpreadReflect

`reflect value`

Instances
Eq Spread Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Spread Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Spread Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Spread :: Type -> Type #

Methods

from :: Spread -> Rep Spread x #

to :: Rep Spread x -> Spread #

Hashable Spread Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Spread -> Int #

hash :: Spread -> Int #

type Rep Spread Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Spread = D1 (MetaData "Spread" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "SpreadRepeat" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SpreadPad" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SpreadReflect" PrefixI False) (U1 :: Type -> Type)))

data Texture Source #

Describe the different value which can be used in the fill or stroke attributes.

Constructors

ColorRef PixelRGBA8

Direct solid color (rgb)

TextureRef String

Link to a complex texture (url(#name))

FillNone

Equivalent to the none value.

Instances
Eq Texture Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Texture Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Texture Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Texture :: Type -> Type #

Methods

from :: Texture -> Rep Texture x #

to :: Rep Texture x -> Texture #

Hashable Texture Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Texture -> Int #

hash :: Texture -> Int #

type Rep Texture Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Texture = D1 (MetaData "Texture" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "ColorRef" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PixelRGBA8)) :+: (C1 (MetaCons "TextureRef" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "FillNone" PrefixI False) (U1 :: Type -> Type)))

data Element Source #

Sum types helping keeping track of all the namable elemens in a SVG document.

Instances
Eq Element Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Element Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Element Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Element :: Type -> Type #

Methods

from :: Element -> Rep Element x #

to :: Rep Element x -> Element #

Hashable Element Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Element -> Int #

hash :: Element -> Int #

type Rep Element Source # 
Instance details

Defined in Graphics.SvgTree.Types

data FillRule Source #

Describe the possile filling algorithms. Map the values of the `fill-rule` attributes.

Constructors

FillEvenOdd

Correspond to the evenodd value.

FillNonZero

Correspond to the nonzero value.

Instances
Eq FillRule Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show FillRule Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic FillRule Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep FillRule :: Type -> Type #

Methods

from :: FillRule -> Rep FillRule x #

to :: Rep FillRule x -> FillRule #

Hashable FillRule Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> FillRule -> Int #

hash :: FillRule -> Int #

type Rep FillRule Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FillRule = D1 (MetaData "FillRule" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "FillEvenOdd" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FillNonZero" PrefixI False) (U1 :: Type -> Type))

data FontStyle Source #

Classify the font style, used to search a matching font in the FontCache.

Instances
Eq FontStyle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show FontStyle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic FontStyle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep FontStyle :: Type -> Type #

Hashable FontStyle Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FontStyle Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FontStyle = D1 (MetaData "FontStyle" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "FontStyleNormal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FontStyleItalic" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FontStyleOblique" PrefixI False) (U1 :: Type -> Type)))

type Dpi = Int Source #

Alias describing a "dot per inch" information used for size calculation (see toUserUnit).

class WithDefaultSvg a where Source #

Define an empty 'default' element for the SVG tree. It is used as base when parsing the element from XML.

Methods

defaultSvg :: a Source #

The default element.

Instances
WithDefaultSvg DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

defaultSvg :: Group a Source #

Main type

data Document Source #

Represent a full svg document with style, geometry and named elements.

Instances
Eq Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Document :: Type -> Type #

Methods

from :: Document -> Rep Document x #

to :: Rep Document x -> Document #

Hashable Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Document -> Int #

hash :: Document -> Int #

HasDocument Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Document Source # 
Instance details

Defined in Graphics.SvgTree.Types

documentSize :: Dpi -> Document -> (Int, Int) Source #

Calculate the document size in function of the different available attributes in the document.

Drawing attributes

data DrawAttributes Source #

This type define how to draw any primitives, which color to use, how to stroke the primitives and the potential transformations to use.

All these attributes are propagated to the children.

Constructors

DrawAttributes 

Fields

Instances
Eq DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep DrawAttributes :: Type -> Type #

Semigroup DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Monoid DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Hashable DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' DrawAttributes DrawAttributes Source #

attrClass :: Lens' DrawAttributes [Text] Source #

attrId :: Lens' DrawAttributes (Maybe String) Source #

clipPathRef :: Lens' DrawAttributes (Last ElementRef) Source #

clipRule :: Lens' DrawAttributes (Last FillRule) Source #

fillColor :: Lens' DrawAttributes (Last Texture) Source #

fillOpacity :: Lens' DrawAttributes (Maybe Float) Source #

fillRule :: Lens' DrawAttributes (Last FillRule) Source #

filterRef :: Lens' DrawAttributes (Last ElementRef) Source #

fontFamily :: Lens' DrawAttributes (Last [String]) Source #

fontSize :: Lens' DrawAttributes (Last Number) Source #

fontStyle :: Lens' DrawAttributes (Last FontStyle) Source #

groupOpacity :: Lens' DrawAttributes (Maybe Float) Source #

markerEnd :: Lens' DrawAttributes (Last ElementRef) Source #

markerMid :: Lens' DrawAttributes (Last ElementRef) Source #

markerStart :: Lens' DrawAttributes (Last ElementRef) Source #

maskRef :: Lens' DrawAttributes (Last ElementRef) Source #

preRendered :: Lens' DrawAttributes (Maybe String) Source #

strokeColor :: Lens' DrawAttributes (Last Texture) Source #

strokeDashArray :: Lens' DrawAttributes (Last [Number]) Source #

strokeLineCap :: Lens' DrawAttributes (Last Cap) Source #

strokeLineJoin :: Lens' DrawAttributes (Last LineJoin) Source #

strokeMiterLimit :: Lens' DrawAttributes (Last Double) Source #

strokeOffset :: Lens' DrawAttributes (Last Number) Source #

strokeOpacity :: Lens' DrawAttributes (Maybe Float) Source #

strokeWidth :: Lens' DrawAttributes (Last Number) Source #

textAnchor :: Lens' DrawAttributes (Last TextAnchor) Source #

transform :: Lens' DrawAttributes (Maybe [Transformation]) Source #

type Rep DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep DrawAttributes = D1 (MetaData "DrawAttributes" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "DrawAttributes" PrefixI True) ((((S1 (MetaSel (Just "_strokeWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: (S1 (MetaSel (Just "_strokeColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Texture)) :*: S1 (MetaSel (Just "_strokeOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Float)))) :*: (S1 (MetaSel (Just "_strokeLineCap") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Cap)) :*: (S1 (MetaSel (Just "_strokeLineJoin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last LineJoin)) :*: S1 (MetaSel (Just "_strokeMiterLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Double))))) :*: ((S1 (MetaSel (Just "_fillColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Texture)) :*: (S1 (MetaSel (Just "_fillOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Float)) :*: S1 (MetaSel (Just "_groupOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Float)))) :*: ((S1 (MetaSel (Just "_transform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Transformation])) :*: S1 (MetaSel (Just "_fillRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FillRule))) :*: (S1 (MetaSel (Just "_maskRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef)) :*: S1 (MetaSel (Just "_clipPathRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef)))))) :*: (((S1 (MetaSel (Just "_clipRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FillRule)) :*: (S1 (MetaSel (Just "_attrClass") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Text]) :*: S1 (MetaSel (Just "_attrId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe String)))) :*: ((S1 (MetaSel (Just "_strokeOffset") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: S1 (MetaSel (Just "_strokeDashArray") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last [Number]))) :*: (S1 (MetaSel (Just "_fontSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: S1 (MetaSel (Just "_fontFamily") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last [String]))))) :*: ((S1 (MetaSel (Just "_fontStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FontStyle)) :*: (S1 (MetaSel (Just "_textAnchor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last TextAnchor)) :*: S1 (MetaSel (Just "_markerStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef)))) :*: ((S1 (MetaSel (Just "_markerMid") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef)) :*: S1 (MetaSel (Just "_markerEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef))) :*: (S1 (MetaSel (Just "_filterRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last ElementRef)) :*: S1 (MetaSel (Just "_preRendered") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe String))))))))

class HasDrawAttributes c where Source #

Minimal complete definition

drawAttributes

Instances
HasDrawAttributes DrawAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' DrawAttributes DrawAttributes Source #

attrClass :: Lens' DrawAttributes [Text] Source #

attrId :: Lens' DrawAttributes (Maybe String) Source #

clipPathRef :: Lens' DrawAttributes (Last ElementRef) Source #

clipRule :: Lens' DrawAttributes (Last FillRule) Source #

fillColor :: Lens' DrawAttributes (Last Texture) Source #

fillOpacity :: Lens' DrawAttributes (Maybe Float) Source #

fillRule :: Lens' DrawAttributes (Last FillRule) Source #

filterRef :: Lens' DrawAttributes (Last ElementRef) Source #

fontFamily :: Lens' DrawAttributes (Last [String]) Source #

fontSize :: Lens' DrawAttributes (Last Number) Source #

fontStyle :: Lens' DrawAttributes (Last FontStyle) Source #

groupOpacity :: Lens' DrawAttributes (Maybe Float) Source #

markerEnd :: Lens' DrawAttributes (Last ElementRef) Source #

markerMid :: Lens' DrawAttributes (Last ElementRef) Source #

markerStart :: Lens' DrawAttributes (Last ElementRef) Source #

maskRef :: Lens' DrawAttributes (Last ElementRef) Source #

preRendered :: Lens' DrawAttributes (Maybe String) Source #

strokeColor :: Lens' DrawAttributes (Last Texture) Source #

strokeDashArray :: Lens' DrawAttributes (Last [Number]) Source #

strokeLineCap :: Lens' DrawAttributes (Last Cap) Source #

strokeLineJoin :: Lens' DrawAttributes (Last LineJoin) Source #

strokeMiterLimit :: Lens' DrawAttributes (Last Double) Source #

strokeOffset :: Lens' DrawAttributes (Last Number) Source #

strokeOpacity :: Lens' DrawAttributes (Maybe Float) Source #

strokeWidth :: Lens' DrawAttributes (Last Number) Source #

textAnchor :: Lens' DrawAttributes (Last TextAnchor) Source #

transform :: Lens' DrawAttributes (Maybe [Transformation]) Source #

HasDrawAttributes Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' RadialGradient DrawAttributes Source #

attrClass :: Lens' RadialGradient [Text] Source #

attrId :: Lens' RadialGradient (Maybe String) Source #

clipPathRef :: Lens' RadialGradient (Last ElementRef) Source #

clipRule :: Lens' RadialGradient (Last FillRule) Source #

fillColor :: Lens' RadialGradient (Last Texture) Source #

fillOpacity :: Lens' RadialGradient (Maybe Float) Source #

fillRule :: Lens' RadialGradient (Last FillRule) Source #

filterRef :: Lens' RadialGradient (Last ElementRef) Source #

fontFamily :: Lens' RadialGradient (Last [String]) Source #

fontSize :: Lens' RadialGradient (Last Number) Source #

fontStyle :: Lens' RadialGradient (Last FontStyle) Source #

groupOpacity :: Lens' RadialGradient (Maybe Float) Source #

markerEnd :: Lens' RadialGradient (Last ElementRef) Source #

markerMid :: Lens' RadialGradient (Last ElementRef) Source #

markerStart :: Lens' RadialGradient (Last ElementRef) Source #

maskRef :: Lens' RadialGradient (Last ElementRef) Source #

preRendered :: Lens' RadialGradient (Maybe String) Source #

strokeColor :: Lens' RadialGradient (Last Texture) Source #

strokeDashArray :: Lens' RadialGradient (Last [Number]) Source #

strokeLineCap :: Lens' RadialGradient (Last Cap) Source #

strokeLineJoin :: Lens' RadialGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' RadialGradient (Last Double) Source #

strokeOffset :: Lens' RadialGradient (Last Number) Source #

strokeOpacity :: Lens' RadialGradient (Maybe Float) Source #

strokeWidth :: Lens' RadialGradient (Last Number) Source #

textAnchor :: Lens' RadialGradient (Last TextAnchor) Source #

transform :: Lens' RadialGradient (Maybe [Transformation]) Source #

HasDrawAttributes LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' LinearGradient DrawAttributes Source #

attrClass :: Lens' LinearGradient [Text] Source #

attrId :: Lens' LinearGradient (Maybe String) Source #

clipPathRef :: Lens' LinearGradient (Last ElementRef) Source #

clipRule :: Lens' LinearGradient (Last FillRule) Source #

fillColor :: Lens' LinearGradient (Last Texture) Source #

fillOpacity :: Lens' LinearGradient (Maybe Float) Source #

fillRule :: Lens' LinearGradient (Last FillRule) Source #

filterRef :: Lens' LinearGradient (Last ElementRef) Source #

fontFamily :: Lens' LinearGradient (Last [String]) Source #

fontSize :: Lens' LinearGradient (Last Number) Source #

fontStyle :: Lens' LinearGradient (Last FontStyle) Source #

groupOpacity :: Lens' LinearGradient (Maybe Float) Source #

markerEnd :: Lens' LinearGradient (Last ElementRef) Source #

markerMid :: Lens' LinearGradient (Last ElementRef) Source #

markerStart :: Lens' LinearGradient (Last ElementRef) Source #

maskRef :: Lens' LinearGradient (Last ElementRef) Source #

preRendered :: Lens' LinearGradient (Maybe String) Source #

strokeColor :: Lens' LinearGradient (Last Texture) Source #

strokeDashArray :: Lens' LinearGradient (Last [Number]) Source #

strokeLineCap :: Lens' LinearGradient (Last Cap) Source #

strokeLineJoin :: Lens' LinearGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' LinearGradient (Last Double) Source #

strokeOffset :: Lens' LinearGradient (Last Number) Source #

strokeOpacity :: Lens' LinearGradient (Maybe Float) Source #

strokeWidth :: Lens' LinearGradient (Last Number) Source #

textAnchor :: Lens' LinearGradient (Last TextAnchor) Source #

transform :: Lens' LinearGradient (Maybe [Transformation]) Source #

HasDrawAttributes Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' GaussianBlur DrawAttributes Source #

attrClass :: Lens' GaussianBlur [Text] Source #

attrId :: Lens' GaussianBlur (Maybe String) Source #

clipPathRef :: Lens' GaussianBlur (Last ElementRef) Source #

clipRule :: Lens' GaussianBlur (Last FillRule) Source #

fillColor :: Lens' GaussianBlur (Last Texture) Source #

fillOpacity :: Lens' GaussianBlur (Maybe Float) Source #

fillRule :: Lens' GaussianBlur (Last FillRule) Source #

filterRef :: Lens' GaussianBlur (Last ElementRef) Source #

fontFamily :: Lens' GaussianBlur (Last [String]) Source #

fontSize :: Lens' GaussianBlur (Last Number) Source #

fontStyle :: Lens' GaussianBlur (Last FontStyle) Source #

groupOpacity :: Lens' GaussianBlur (Maybe Float) Source #

markerEnd :: Lens' GaussianBlur (Last ElementRef) Source #

markerMid :: Lens' GaussianBlur (Last ElementRef) Source #

markerStart :: Lens' GaussianBlur (Last ElementRef) Source #

maskRef :: Lens' GaussianBlur (Last ElementRef) Source #

preRendered :: Lens' GaussianBlur (Maybe String) Source #

strokeColor :: Lens' GaussianBlur (Last Texture) Source #

strokeDashArray :: Lens' GaussianBlur (Last [Number]) Source #

strokeLineCap :: Lens' GaussianBlur (Last Cap) Source #

strokeLineJoin :: Lens' GaussianBlur (Last LineJoin) Source #

strokeMiterLimit :: Lens' GaussianBlur (Last Double) Source #

strokeOffset :: Lens' GaussianBlur (Last Number) Source #

strokeOpacity :: Lens' GaussianBlur (Maybe Float) Source #

strokeWidth :: Lens' GaussianBlur (Last Number) Source #

textAnchor :: Lens' GaussianBlur (Last TextAnchor) Source #

transform :: Lens' GaussianBlur (Maybe [Transformation]) Source #

HasDrawAttributes Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Turbulence DrawAttributes Source #

attrClass :: Lens' Turbulence [Text] Source #

attrId :: Lens' Turbulence (Maybe String) Source #

clipPathRef :: Lens' Turbulence (Last ElementRef) Source #

clipRule :: Lens' Turbulence (Last FillRule) Source #

fillColor :: Lens' Turbulence (Last Texture) Source #

fillOpacity :: Lens' Turbulence (Maybe Float) Source #

fillRule :: Lens' Turbulence (Last FillRule) Source #

filterRef :: Lens' Turbulence (Last ElementRef) Source #

fontFamily :: Lens' Turbulence (Last [String]) Source #

fontSize :: Lens' Turbulence (Last Number) Source #

fontStyle :: Lens' Turbulence (Last FontStyle) Source #

groupOpacity :: Lens' Turbulence (Maybe Float) Source #

markerEnd :: Lens' Turbulence (Last ElementRef) Source #

markerMid :: Lens' Turbulence (Last ElementRef) Source #

markerStart :: Lens' Turbulence (Last ElementRef) Source #

maskRef :: Lens' Turbulence (Last ElementRef) Source #

preRendered :: Lens' Turbulence (Maybe String) Source #

strokeColor :: Lens' Turbulence (Last Texture) Source #

strokeDashArray :: Lens' Turbulence (Last [Number]) Source #

strokeLineCap :: Lens' Turbulence (Last Cap) Source #

strokeLineJoin :: Lens' Turbulence (Last LineJoin) Source #

strokeMiterLimit :: Lens' Turbulence (Last Double) Source #

strokeOffset :: Lens' Turbulence (Last Number) Source #

strokeOpacity :: Lens' Turbulence (Maybe Float) Source #

strokeWidth :: Lens' Turbulence (Last Number) Source #

textAnchor :: Lens' Turbulence (Last TextAnchor) Source #

transform :: Lens' Turbulence (Maybe [Transformation]) Source #

HasDrawAttributes Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Composite DrawAttributes Source #

attrClass :: Lens' Composite [Text] Source #

attrId :: Lens' Composite (Maybe String) Source #

clipPathRef :: Lens' Composite (Last ElementRef) Source #

clipRule :: Lens' Composite (Last FillRule) Source #

fillColor :: Lens' Composite (Last Texture) Source #

fillOpacity :: Lens' Composite (Maybe Float) Source #

fillRule :: Lens' Composite (Last FillRule) Source #

filterRef :: Lens' Composite (Last ElementRef) Source #

fontFamily :: Lens' Composite (Last [String]) Source #

fontSize :: Lens' Composite (Last Number) Source #

fontStyle :: Lens' Composite (Last FontStyle) Source #

groupOpacity :: Lens' Composite (Maybe Float) Source #

markerEnd :: Lens' Composite (Last ElementRef) Source #

markerMid :: Lens' Composite (Last ElementRef) Source #

markerStart :: Lens' Composite (Last ElementRef) Source #

maskRef :: Lens' Composite (Last ElementRef) Source #

preRendered :: Lens' Composite (Maybe String) Source #

strokeColor :: Lens' Composite (Last Texture) Source #

strokeDashArray :: Lens' Composite (Last [Number]) Source #

strokeLineCap :: Lens' Composite (Last Cap) Source #

strokeLineJoin :: Lens' Composite (Last LineJoin) Source #

strokeMiterLimit :: Lens' Composite (Last Double) Source #

strokeOffset :: Lens' Composite (Last Number) Source #

strokeOpacity :: Lens' Composite (Maybe Float) Source #

strokeWidth :: Lens' Composite (Last Number) Source #

textAnchor :: Lens' Composite (Last TextAnchor) Source #

transform :: Lens' Composite (Maybe [Transformation]) Source #

HasDrawAttributes ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' ColorMatrix DrawAttributes Source #

attrClass :: Lens' ColorMatrix [Text] Source #

attrId :: Lens' ColorMatrix (Maybe String) Source #

clipPathRef :: Lens' ColorMatrix (Last ElementRef) Source #

clipRule :: Lens' ColorMatrix (Last FillRule) Source #

fillColor :: Lens' ColorMatrix (Last Texture) Source #

fillOpacity :: Lens' ColorMatrix (Maybe Float) Source #

fillRule :: Lens' ColorMatrix (Last FillRule) Source #

filterRef :: Lens' ColorMatrix (Last ElementRef) Source #

fontFamily :: Lens' ColorMatrix (Last [String]) Source #

fontSize :: Lens' ColorMatrix (Last Number) Source #

fontStyle :: Lens' ColorMatrix (Last FontStyle) Source #

groupOpacity :: Lens' ColorMatrix (Maybe Float) Source #

markerEnd :: Lens' ColorMatrix (Last ElementRef) Source #

markerMid :: Lens' ColorMatrix (Last ElementRef) Source #

markerStart :: Lens' ColorMatrix (Last ElementRef) Source #

maskRef :: Lens' ColorMatrix (Last ElementRef) Source #

preRendered :: Lens' ColorMatrix (Maybe String) Source #

strokeColor :: Lens' ColorMatrix (Last Texture) Source #

strokeDashArray :: Lens' ColorMatrix (Last [Number]) Source #

strokeLineCap :: Lens' ColorMatrix (Last Cap) Source #

strokeLineJoin :: Lens' ColorMatrix (Last LineJoin) Source #

strokeMiterLimit :: Lens' ColorMatrix (Last Double) Source #

strokeOffset :: Lens' ColorMatrix (Last Number) Source #

strokeOpacity :: Lens' ColorMatrix (Maybe Float) Source #

strokeWidth :: Lens' ColorMatrix (Last Number) Source #

textAnchor :: Lens' ColorMatrix (Last TextAnchor) Source #

transform :: Lens' ColorMatrix (Maybe [Transformation]) Source #

HasDrawAttributes DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' DisplacementMap DrawAttributes Source #

attrClass :: Lens' DisplacementMap [Text] Source #

attrId :: Lens' DisplacementMap (Maybe String) Source #

clipPathRef :: Lens' DisplacementMap (Last ElementRef) Source #

clipRule :: Lens' DisplacementMap (Last FillRule) Source #

fillColor :: Lens' DisplacementMap (Last Texture) Source #

fillOpacity :: Lens' DisplacementMap (Maybe Float) Source #

fillRule :: Lens' DisplacementMap (Last FillRule) Source #

filterRef :: Lens' DisplacementMap (Last ElementRef) Source #

fontFamily :: Lens' DisplacementMap (Last [String]) Source #

fontSize :: Lens' DisplacementMap (Last Number) Source #

fontStyle :: Lens' DisplacementMap (Last FontStyle) Source #

groupOpacity :: Lens' DisplacementMap (Maybe Float) Source #

markerEnd :: Lens' DisplacementMap (Last ElementRef) Source #

markerMid :: Lens' DisplacementMap (Last ElementRef) Source #

markerStart :: Lens' DisplacementMap (Last ElementRef) Source #

maskRef :: Lens' DisplacementMap (Last ElementRef) Source #

preRendered :: Lens' DisplacementMap (Maybe String) Source #

strokeColor :: Lens' DisplacementMap (Last Texture) Source #

strokeDashArray :: Lens' DisplacementMap (Last [Number]) Source #

strokeLineCap :: Lens' DisplacementMap (Last Cap) Source #

strokeLineJoin :: Lens' DisplacementMap (Last LineJoin) Source #

strokeMiterLimit :: Lens' DisplacementMap (Last Double) Source #

strokeOffset :: Lens' DisplacementMap (Last Number) Source #

strokeOpacity :: Lens' DisplacementMap (Maybe Float) Source #

strokeWidth :: Lens' DisplacementMap (Last Number) Source #

textAnchor :: Lens' DisplacementMap (Last TextAnchor) Source #

transform :: Lens' DisplacementMap (Maybe [Transformation]) Source #

HasDrawAttributes Tree Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' MeshGradient DrawAttributes Source #

attrClass :: Lens' MeshGradient [Text] Source #

attrId :: Lens' MeshGradient (Maybe String) Source #

clipPathRef :: Lens' MeshGradient (Last ElementRef) Source #

clipRule :: Lens' MeshGradient (Last FillRule) Source #

fillColor :: Lens' MeshGradient (Last Texture) Source #

fillOpacity :: Lens' MeshGradient (Maybe Float) Source #

fillRule :: Lens' MeshGradient (Last FillRule) Source #

filterRef :: Lens' MeshGradient (Last ElementRef) Source #

fontFamily :: Lens' MeshGradient (Last [String]) Source #

fontSize :: Lens' MeshGradient (Last Number) Source #

fontStyle :: Lens' MeshGradient (Last FontStyle) Source #

groupOpacity :: Lens' MeshGradient (Maybe Float) Source #

markerEnd :: Lens' MeshGradient (Last ElementRef) Source #

markerMid :: Lens' MeshGradient (Last ElementRef) Source #

markerStart :: Lens' MeshGradient (Last ElementRef) Source #

maskRef :: Lens' MeshGradient (Last ElementRef) Source #

preRendered :: Lens' MeshGradient (Maybe String) Source #

strokeColor :: Lens' MeshGradient (Last Texture) Source #

strokeDashArray :: Lens' MeshGradient (Last [Number]) Source #

strokeLineCap :: Lens' MeshGradient (Last Cap) Source #

strokeLineJoin :: Lens' MeshGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' MeshGradient (Last Double) Source #

strokeOffset :: Lens' MeshGradient (Last Number) Source #

strokeOpacity :: Lens' MeshGradient (Maybe Float) Source #

strokeWidth :: Lens' MeshGradient (Last Number) Source #

textAnchor :: Lens' MeshGradient (Last TextAnchor) Source #

transform :: Lens' MeshGradient (Maybe [Transformation]) Source #

HasDrawAttributes Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Rectangle DrawAttributes Source #

attrClass :: Lens' Rectangle [Text] Source #

attrId :: Lens' Rectangle (Maybe String) Source #

clipPathRef :: Lens' Rectangle (Last ElementRef) Source #

clipRule :: Lens' Rectangle (Last FillRule) Source #

fillColor :: Lens' Rectangle (Last Texture) Source #

fillOpacity :: Lens' Rectangle (Maybe Float) Source #

fillRule :: Lens' Rectangle (Last FillRule) Source #

filterRef :: Lens' Rectangle (Last ElementRef) Source #

fontFamily :: Lens' Rectangle (Last [String]) Source #

fontSize :: Lens' Rectangle (Last Number) Source #

fontStyle :: Lens' Rectangle (Last FontStyle) Source #

groupOpacity :: Lens' Rectangle (Maybe Float) Source #

markerEnd :: Lens' Rectangle (Last ElementRef) Source #

markerMid :: Lens' Rectangle (Last ElementRef) Source #

markerStart :: Lens' Rectangle (Last ElementRef) Source #

maskRef :: Lens' Rectangle (Last ElementRef) Source #

preRendered :: Lens' Rectangle (Maybe String) Source #

strokeColor :: Lens' Rectangle (Last Texture) Source #

strokeDashArray :: Lens' Rectangle (Last [Number]) Source #

strokeLineCap :: Lens' Rectangle (Last Cap) Source #

strokeLineJoin :: Lens' Rectangle (Last LineJoin) Source #

strokeMiterLimit :: Lens' Rectangle (Last Double) Source #

strokeOffset :: Lens' Rectangle (Last Number) Source #

strokeOpacity :: Lens' Rectangle (Maybe Float) Source #

strokeWidth :: Lens' Rectangle (Last Number) Source #

textAnchor :: Lens' Rectangle (Last TextAnchor) Source #

transform :: Lens' Rectangle (Maybe [Transformation]) Source #

HasDrawAttributes Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Definitions a) DrawAttributes Source #

attrClass :: Lens' (Definitions a) [Text] Source #

attrId :: Lens' (Definitions a) (Maybe String) Source #

clipPathRef :: Lens' (Definitions a) (Last ElementRef) Source #

clipRule :: Lens' (Definitions a) (Last FillRule) Source #

fillColor :: Lens' (Definitions a) (Last Texture) Source #

fillOpacity :: Lens' (Definitions a) (Maybe Float) Source #

fillRule :: Lens' (Definitions a) (Last FillRule) Source #

filterRef :: Lens' (Definitions a) (Last ElementRef) Source #

fontFamily :: Lens' (Definitions a) (Last [String]) Source #

fontSize :: Lens' (Definitions a) (Last Number) Source #

fontStyle :: Lens' (Definitions a) (Last FontStyle) Source #

groupOpacity :: Lens' (Definitions a) (Maybe Float) Source #

markerEnd :: Lens' (Definitions a) (Last ElementRef) Source #

markerMid :: Lens' (Definitions a) (Last ElementRef) Source #

markerStart :: Lens' (Definitions a) (Last ElementRef) Source #

maskRef :: Lens' (Definitions a) (Last ElementRef) Source #

preRendered :: Lens' (Definitions a) (Maybe String) Source #

strokeColor :: Lens' (Definitions a) (Last Texture) Source #

strokeDashArray :: Lens' (Definitions a) (Last [Number]) Source #

strokeLineCap :: Lens' (Definitions a) (Last Cap) Source #

strokeLineJoin :: Lens' (Definitions a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Definitions a) (Last Double) Source #

strokeOffset :: Lens' (Definitions a) (Last Number) Source #

strokeOpacity :: Lens' (Definitions a) (Maybe Float) Source #

strokeWidth :: Lens' (Definitions a) (Last Number) Source #

textAnchor :: Lens' (Definitions a) (Last TextAnchor) Source #

transform :: Lens' (Definitions a) (Maybe [Transformation]) Source #

HasDrawAttributes (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Symbol a) DrawAttributes Source #

attrClass :: Lens' (Symbol a) [Text] Source #

attrId :: Lens' (Symbol a) (Maybe String) Source #

clipPathRef :: Lens' (Symbol a) (Last ElementRef) Source #

clipRule :: Lens' (Symbol a) (Last FillRule) Source #

fillColor :: Lens' (Symbol a) (Last Texture) Source #

fillOpacity :: Lens' (Symbol a) (Maybe Float) Source #

fillRule :: Lens' (Symbol a) (Last FillRule) Source #

filterRef :: Lens' (Symbol a) (Last ElementRef) Source #

fontFamily :: Lens' (Symbol a) (Last [String]) Source #

fontSize :: Lens' (Symbol a) (Last Number) Source #

fontStyle :: Lens' (Symbol a) (Last FontStyle) Source #

groupOpacity :: Lens' (Symbol a) (Maybe Float) Source #

markerEnd :: Lens' (Symbol a) (Last ElementRef) Source #

markerMid :: Lens' (Symbol a) (Last ElementRef) Source #

markerStart :: Lens' (Symbol a) (Last ElementRef) Source #

maskRef :: Lens' (Symbol a) (Last ElementRef) Source #

preRendered :: Lens' (Symbol a) (Maybe String) Source #

strokeColor :: Lens' (Symbol a) (Last Texture) Source #

strokeDashArray :: Lens' (Symbol a) (Last [Number]) Source #

strokeLineCap :: Lens' (Symbol a) (Last Cap) Source #

strokeLineJoin :: Lens' (Symbol a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Symbol a) (Last Double) Source #

strokeOffset :: Lens' (Symbol a) (Last Number) Source #

strokeOpacity :: Lens' (Symbol a) (Maybe Float) Source #

strokeWidth :: Lens' (Symbol a) (Last Number) Source #

textAnchor :: Lens' (Symbol a) (Last TextAnchor) Source #

transform :: Lens' (Symbol a) (Maybe [Transformation]) Source #

HasDrawAttributes (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Group a) DrawAttributes Source #

attrClass :: Lens' (Group a) [Text] Source #

attrId :: Lens' (Group a) (Maybe String) Source #

clipPathRef :: Lens' (Group a) (Last ElementRef) Source #

clipRule :: Lens' (Group a) (Last FillRule) Source #

fillColor :: Lens' (Group a) (Last Texture) Source #

fillOpacity :: Lens' (Group a) (Maybe Float) Source #

fillRule :: Lens' (Group a) (Last FillRule) Source #

filterRef :: Lens' (Group a) (Last ElementRef) Source #

fontFamily :: Lens' (Group a) (Last [String]) Source #

fontSize :: Lens' (Group a) (Last Number) Source #

fontStyle :: Lens' (Group a) (Last FontStyle) Source #

groupOpacity :: Lens' (Group a) (Maybe Float) Source #

markerEnd :: Lens' (Group a) (Last ElementRef) Source #

markerMid :: Lens' (Group a) (Last ElementRef) Source #

markerStart :: Lens' (Group a) (Last ElementRef) Source #

maskRef :: Lens' (Group a) (Last ElementRef) Source #

preRendered :: Lens' (Group a) (Maybe String) Source #

strokeColor :: Lens' (Group a) (Last Texture) Source #

strokeDashArray :: Lens' (Group a) (Last [Number]) Source #

strokeLineCap :: Lens' (Group a) (Last Cap) Source #

strokeLineJoin :: Lens' (Group a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Group a) (Last Double) Source #

strokeOffset :: Lens' (Group a) (Last Number) Source #

strokeOpacity :: Lens' (Group a) (Maybe Float) Source #

strokeWidth :: Lens' (Group a) (Last Number) Source #

textAnchor :: Lens' (Group a) (Last TextAnchor) Source #

transform :: Lens' (Group a) (Maybe [Transformation]) Source #

Filters

data FilterElement Source #

Instances
Eq FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep FilterElement :: Type -> Type #

Hashable FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterElement = D1 (MetaData "FilterElement" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((((C1 (MetaCons "FEBlend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FEColorMatrix" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ColorMatrix))) :+: (C1 (MetaCons "FEComponentTransfer" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEComposite" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Composite)) :+: C1 (MetaCons "FEConvolveMatrix" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "FEDiffuseLighting" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEDisplacementMap" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DisplacementMap)) :+: C1 (MetaCons "FEDropShadow" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "FEFlood" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEFuncA" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FEFuncB" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "FEFuncG" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEFuncR" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FEGaussianBlur" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 GaussianBlur)))) :+: (C1 (MetaCons "FEImage" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEMerge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FEMergeNode" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "FEMorphology" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FEOffset" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FESpecularLighting" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "FETile" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FETurbulence" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Turbulence)) :+: C1 (MetaCons "FENone" PrefixI False) (U1 :: Type -> Type))))))

data FilterAttributes Source #

Instances
Eq FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep FilterAttributes :: Type -> Type #

Hashable FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterAttributes = D1 (MetaData "FilterAttributes" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "FilterAttributes" PrefixI True) ((S1 (MetaSel (Just "_filterHeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: S1 (MetaSel (Just "_filterResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe String))) :*: (S1 (MetaSel (Just "_filterWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: (S1 (MetaSel (Just "_filterX") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number)) :*: S1 (MetaSel (Just "_filterY") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Number))))))

class HasFilterAttributes c_asYk where Source #

Lenses for the FilterAttributes type.

Minimal complete definition

filterAttributes

Instances
HasFilterAttributes FilterAttributes Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes FilterElement Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

data FilterSource Source #

Instances
Eq FilterSource Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show FilterSource Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic FilterSource Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep FilterSource :: Type -> Type #

Hashable FilterSource Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterSource Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep FilterSource = D1 (MetaData "FilterSource" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((C1 (MetaCons "SourceGraphic" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SourceAlpha" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BackgroundImage" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BackgroundAlpha" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FillPaint" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "StrokePaint" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SourceRef" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)))))

data ColorMatrixType Source #

Instances
Eq ColorMatrixType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show ColorMatrixType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic ColorMatrixType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep ColorMatrixType :: Type -> Type #

Hashable ColorMatrixType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ColorMatrixType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ColorMatrixType = D1 (MetaData "ColorMatrixType" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((C1 (MetaCons "Matrix" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Saturate" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "HueRotate" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LuminanceToAlpha" PrefixI False) (U1 :: Type -> Type)))

data ColorMatrix Source #

Instances
Eq ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep ColorMatrix :: Type -> Type #

Hashable ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' ColorMatrix DrawAttributes Source #

attrClass :: Lens' ColorMatrix [Text] Source #

attrId :: Lens' ColorMatrix (Maybe String) Source #

clipPathRef :: Lens' ColorMatrix (Last ElementRef) Source #

clipRule :: Lens' ColorMatrix (Last FillRule) Source #

fillColor :: Lens' ColorMatrix (Last Texture) Source #

fillOpacity :: Lens' ColorMatrix (Maybe Float) Source #

fillRule :: Lens' ColorMatrix (Last FillRule) Source #

filterRef :: Lens' ColorMatrix (Last ElementRef) Source #

fontFamily :: Lens' ColorMatrix (Last [String]) Source #

fontSize :: Lens' ColorMatrix (Last Number) Source #

fontStyle :: Lens' ColorMatrix (Last FontStyle) Source #

groupOpacity :: Lens' ColorMatrix (Maybe Float) Source #

markerEnd :: Lens' ColorMatrix (Last ElementRef) Source #

markerMid :: Lens' ColorMatrix (Last ElementRef) Source #

markerStart :: Lens' ColorMatrix (Last ElementRef) Source #

maskRef :: Lens' ColorMatrix (Last ElementRef) Source #

preRendered :: Lens' ColorMatrix (Maybe String) Source #

strokeColor :: Lens' ColorMatrix (Last Texture) Source #

strokeDashArray :: Lens' ColorMatrix (Last [Number]) Source #

strokeLineCap :: Lens' ColorMatrix (Last Cap) Source #

strokeLineJoin :: Lens' ColorMatrix (Last LineJoin) Source #

strokeMiterLimit :: Lens' ColorMatrix (Last Double) Source #

strokeOffset :: Lens' ColorMatrix (Last Number) Source #

strokeOpacity :: Lens' ColorMatrix (Maybe Float) Source #

strokeWidth :: Lens' ColorMatrix (Last Number) Source #

textAnchor :: Lens' ColorMatrix (Last TextAnchor) Source #

transform :: Lens' ColorMatrix (Maybe [Transformation]) Source #

HasFilterAttributes ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasColorMatrix ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ColorMatrix Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ColorMatrix = D1 (MetaData "ColorMatrix" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "ColorMatrix" PrefixI True) ((S1 (MetaSel (Just "_colorMatrixDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_colorMatrixFilterAttr") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FilterAttributes)) :*: (S1 (MetaSel (Just "_colorMatrixIn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FilterSource)) :*: (S1 (MetaSel (Just "_colorMatrixType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ColorMatrixType) :*: S1 (MetaSel (Just "_colorMatrixValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String)))))

data Composite Source #

Instances
Eq Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Composite :: Type -> Type #

Hashable Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Composite DrawAttributes Source #

attrClass :: Lens' Composite [Text] Source #

attrId :: Lens' Composite (Maybe String) Source #

clipPathRef :: Lens' Composite (Last ElementRef) Source #

clipRule :: Lens' Composite (Last FillRule) Source #

fillColor :: Lens' Composite (Last Texture) Source #

fillOpacity :: Lens' Composite (Maybe Float) Source #

fillRule :: Lens' Composite (Last FillRule) Source #

filterRef :: Lens' Composite (Last ElementRef) Source #

fontFamily :: Lens' Composite (Last [String]) Source #

fontSize :: Lens' Composite (Last Number) Source #

fontStyle :: Lens' Composite (Last FontStyle) Source #

groupOpacity :: Lens' Composite (Maybe Float) Source #

markerEnd :: Lens' Composite (Last ElementRef) Source #

markerMid :: Lens' Composite (Last ElementRef) Source #

markerStart :: Lens' Composite (Last ElementRef) Source #

maskRef :: Lens' Composite (Last ElementRef) Source #

preRendered :: Lens' Composite (Maybe String) Source #

strokeColor :: Lens' Composite (Last Texture) Source #

strokeDashArray :: Lens' Composite (Last [Number]) Source #

strokeLineCap :: Lens' Composite (Last Cap) Source #

strokeLineJoin :: Lens' Composite (Last LineJoin) Source #

strokeMiterLimit :: Lens' Composite (Last Double) Source #

strokeOffset :: Lens' Composite (Last Number) Source #

strokeOpacity :: Lens' Composite (Maybe Float) Source #

strokeWidth :: Lens' Composite (Last Number) Source #

textAnchor :: Lens' Composite (Last TextAnchor) Source #

transform :: Lens' Composite (Maybe [Transformation]) Source #

HasFilterAttributes Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasComposite Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Composite Source # 
Instance details

Defined in Graphics.SvgTree.Types

data CompositeOperator Source #

Instances
Eq CompositeOperator Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show CompositeOperator Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic CompositeOperator Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep CompositeOperator :: Type -> Type #

Hashable CompositeOperator Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep CompositeOperator Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep CompositeOperator = D1 (MetaData "CompositeOperator" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((C1 (MetaCons "CompositeOver" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CompositeIn" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CompositeOut" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "CompositeAtop" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CompositeXor" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CompositeArithmetic" PrefixI False) (U1 :: Type -> Type))))

data EdgeMode Source #

Instances
Eq EdgeMode Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show EdgeMode Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic EdgeMode Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep EdgeMode :: Type -> Type #

Methods

from :: EdgeMode -> Rep EdgeMode x #

to :: Rep EdgeMode x -> EdgeMode #

Hashable EdgeMode Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> EdgeMode -> Int #

hash :: EdgeMode -> Int #

type Rep EdgeMode Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep EdgeMode = D1 (MetaData "EdgeMode" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "EdgeDuplicate" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EdgeWrap" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EdgeNone" PrefixI False) (U1 :: Type -> Type)))

data GaussianBlur Source #

Instances
Eq GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep GaussianBlur :: Type -> Type #

Hashable GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' GaussianBlur DrawAttributes Source #

attrClass :: Lens' GaussianBlur [Text] Source #

attrId :: Lens' GaussianBlur (Maybe String) Source #

clipPathRef :: Lens' GaussianBlur (Last ElementRef) Source #

clipRule :: Lens' GaussianBlur (Last FillRule) Source #

fillColor :: Lens' GaussianBlur (Last Texture) Source #

fillOpacity :: Lens' GaussianBlur (Maybe Float) Source #

fillRule :: Lens' GaussianBlur (Last FillRule) Source #

filterRef :: Lens' GaussianBlur (Last ElementRef) Source #

fontFamily :: Lens' GaussianBlur (Last [String]) Source #

fontSize :: Lens' GaussianBlur (Last Number) Source #

fontStyle :: Lens' GaussianBlur (Last FontStyle) Source #

groupOpacity :: Lens' GaussianBlur (Maybe Float) Source #

markerEnd :: Lens' GaussianBlur (Last ElementRef) Source #

markerMid :: Lens' GaussianBlur (Last ElementRef) Source #

markerStart :: Lens' GaussianBlur (Last ElementRef) Source #

maskRef :: Lens' GaussianBlur (Last ElementRef) Source #

preRendered :: Lens' GaussianBlur (Maybe String) Source #

strokeColor :: Lens' GaussianBlur (Last Texture) Source #

strokeDashArray :: Lens' GaussianBlur (Last [Number]) Source #

strokeLineCap :: Lens' GaussianBlur (Last Cap) Source #

strokeLineJoin :: Lens' GaussianBlur (Last LineJoin) Source #

strokeMiterLimit :: Lens' GaussianBlur (Last Double) Source #

strokeOffset :: Lens' GaussianBlur (Last Number) Source #

strokeOpacity :: Lens' GaussianBlur (Maybe Float) Source #

strokeWidth :: Lens' GaussianBlur (Last Number) Source #

textAnchor :: Lens' GaussianBlur (Last TextAnchor) Source #

transform :: Lens' GaussianBlur (Maybe [Transformation]) Source #

HasFilterAttributes GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasGaussianBlur GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep GaussianBlur Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep GaussianBlur = D1 (MetaData "GaussianBlur" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "GaussianBlur" PrefixI True) ((S1 (MetaSel (Just "_gaussianBlurDrawAttributes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_gaussianBlurFilterAttr") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FilterAttributes) :*: S1 (MetaSel (Just "_gaussianBlurIn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Last FilterSource)))) :*: (S1 (MetaSel (Just "_gaussianBlurStdDeviationX") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Number) :*: (S1 (MetaSel (Just "_gaussianBlurStdDeviationY") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Last Number)) :*: S1 (MetaSel (Just "_gaussianBlurEdgeMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EdgeMode)))))

data Turbulence Source #

Instances
Eq Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Turbulence :: Type -> Type #

Hashable Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Turbulence DrawAttributes Source #

attrClass :: Lens' Turbulence [Text] Source #

attrId :: Lens' Turbulence (Maybe String) Source #

clipPathRef :: Lens' Turbulence (Last ElementRef) Source #

clipRule :: Lens' Turbulence (Last FillRule) Source #

fillColor :: Lens' Turbulence (Last Texture) Source #

fillOpacity :: Lens' Turbulence (Maybe Float) Source #

fillRule :: Lens' Turbulence (Last FillRule) Source #

filterRef :: Lens' Turbulence (Last ElementRef) Source #

fontFamily :: Lens' Turbulence (Last [String]) Source #

fontSize :: Lens' Turbulence (Last Number) Source #

fontStyle :: Lens' Turbulence (Last FontStyle) Source #

groupOpacity :: Lens' Turbulence (Maybe Float) Source #

markerEnd :: Lens' Turbulence (Last ElementRef) Source #

markerMid :: Lens' Turbulence (Last ElementRef) Source #

markerStart :: Lens' Turbulence (Last ElementRef) Source #

maskRef :: Lens' Turbulence (Last ElementRef) Source #

preRendered :: Lens' Turbulence (Maybe String) Source #

strokeColor :: Lens' Turbulence (Last Texture) Source #

strokeDashArray :: Lens' Turbulence (Last [Number]) Source #

strokeLineCap :: Lens' Turbulence (Last Cap) Source #

strokeLineJoin :: Lens' Turbulence (Last LineJoin) Source #

strokeMiterLimit :: Lens' Turbulence (Last Double) Source #

strokeOffset :: Lens' Turbulence (Last Number) Source #

strokeOpacity :: Lens' Turbulence (Maybe Float) Source #

strokeWidth :: Lens' Turbulence (Last Number) Source #

textAnchor :: Lens' Turbulence (Last TextAnchor) Source #

transform :: Lens' Turbulence (Maybe [Transformation]) Source #

HasFilterAttributes Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasTurbulence Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Turbulence Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Turbulence = D1 (MetaData "Turbulence" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Turbulence" PrefixI True) ((S1 (MetaSel (Just "_turbulenceDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_turbulenceFilterAttr") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FilterAttributes) :*: S1 (MetaSel (Just "_turbulenceBaseFrequency") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Double, Last Double)))) :*: ((S1 (MetaSel (Just "_turbulenceNumOctaves") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "_turbulenceSeed") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double)) :*: (S1 (MetaSel (Just "_turbulenceStitchTiles") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 StitchTiles) :*: S1 (MetaSel (Just "_turbulenceType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TurbulenceType)))))

data TurbulenceType Source #

Instances
Eq TurbulenceType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TurbulenceType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TurbulenceType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TurbulenceType :: Type -> Type #

Hashable TurbulenceType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TurbulenceType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TurbulenceType = D1 (MetaData "TurbulenceType" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "FractalNoiseType" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TurbulenceType" PrefixI False) (U1 :: Type -> Type))

data StitchTiles Source #

Constructors

NoStitch 
Stitch 
Instances
Eq StitchTiles Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show StitchTiles Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic StitchTiles Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep StitchTiles :: Type -> Type #

Hashable StitchTiles Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep StitchTiles Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep StitchTiles = D1 (MetaData "StitchTiles" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "NoStitch" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Stitch" PrefixI False) (U1 :: Type -> Type))

data DisplacementMap Source #

Instances
Eq DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep DisplacementMap :: Type -> Type #

Hashable DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' DisplacementMap DrawAttributes Source #

attrClass :: Lens' DisplacementMap [Text] Source #

attrId :: Lens' DisplacementMap (Maybe String) Source #

clipPathRef :: Lens' DisplacementMap (Last ElementRef) Source #

clipRule :: Lens' DisplacementMap (Last FillRule) Source #

fillColor :: Lens' DisplacementMap (Last Texture) Source #

fillOpacity :: Lens' DisplacementMap (Maybe Float) Source #

fillRule :: Lens' DisplacementMap (Last FillRule) Source #

filterRef :: Lens' DisplacementMap (Last ElementRef) Source #

fontFamily :: Lens' DisplacementMap (Last [String]) Source #

fontSize :: Lens' DisplacementMap (Last Number) Source #

fontStyle :: Lens' DisplacementMap (Last FontStyle) Source #

groupOpacity :: Lens' DisplacementMap (Maybe Float) Source #

markerEnd :: Lens' DisplacementMap (Last ElementRef) Source #

markerMid :: Lens' DisplacementMap (Last ElementRef) Source #

markerStart :: Lens' DisplacementMap (Last ElementRef) Source #

maskRef :: Lens' DisplacementMap (Last ElementRef) Source #

preRendered :: Lens' DisplacementMap (Maybe String) Source #

strokeColor :: Lens' DisplacementMap (Last Texture) Source #

strokeDashArray :: Lens' DisplacementMap (Last [Number]) Source #

strokeLineCap :: Lens' DisplacementMap (Last Cap) Source #

strokeLineJoin :: Lens' DisplacementMap (Last LineJoin) Source #

strokeMiterLimit :: Lens' DisplacementMap (Last Double) Source #

strokeOffset :: Lens' DisplacementMap (Last Number) Source #

strokeOpacity :: Lens' DisplacementMap (Maybe Float) Source #

strokeWidth :: Lens' DisplacementMap (Last Number) Source #

textAnchor :: Lens' DisplacementMap (Last TextAnchor) Source #

transform :: Lens' DisplacementMap (Maybe [Transformation]) Source #

HasFilterAttributes DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDisplacementMap DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep DisplacementMap Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep DisplacementMap = D1 (MetaData "DisplacementMap" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "DisplacementMap" PrefixI True) ((S1 (MetaSel (Just "_displacementMapDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_displacementMapFilterAttr") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FilterAttributes) :*: S1 (MetaSel (Just "_displacementMapIn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FilterSource)))) :*: ((S1 (MetaSel (Just "_displacementMapIn2") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last FilterSource)) :*: S1 (MetaSel (Just "_displacementMapScale") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Last Double))) :*: (S1 (MetaSel (Just "_displacementMapXChannelSelector") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChannelSelector) :*: S1 (MetaSel (Just "_displacementMapYChannelSelector") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ChannelSelector)))))

data ChannelSelector Source #

Instances
Eq ChannelSelector Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show ChannelSelector Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic ChannelSelector Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep ChannelSelector :: Type -> Type #

Hashable ChannelSelector Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ChannelSelector Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ChannelSelector = D1 (MetaData "ChannelSelector" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) ((C1 (MetaCons "ChannelR" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ChannelG" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ChannelB" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ChannelA" PrefixI False) (U1 :: Type -> Type)))

SVG drawing primitives

Rectangle

data Rectangle Source #

Define a rectangle. Correspond to `<rectangle>` svg tag.

Constructors

Rectangle 

Fields

Instances
Eq Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Rectangle :: Type -> Type #

Hashable Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasRectangle Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' Rectangle DrawAttributes Source #

attrClass :: Lens' Rectangle [Text] Source #

attrId :: Lens' Rectangle (Maybe String) Source #

clipPathRef :: Lens' Rectangle (Last ElementRef) Source #

clipRule :: Lens' Rectangle (Last FillRule) Source #

fillColor :: Lens' Rectangle (Last Texture) Source #

fillOpacity :: Lens' Rectangle (Maybe Float) Source #

fillRule :: Lens' Rectangle (Last FillRule) Source #

filterRef :: Lens' Rectangle (Last ElementRef) Source #

fontFamily :: Lens' Rectangle (Last [String]) Source #

fontSize :: Lens' Rectangle (Last Number) Source #

fontStyle :: Lens' Rectangle (Last FontStyle) Source #

groupOpacity :: Lens' Rectangle (Maybe Float) Source #

markerEnd :: Lens' Rectangle (Last ElementRef) Source #

markerMid :: Lens' Rectangle (Last ElementRef) Source #

markerStart :: Lens' Rectangle (Last ElementRef) Source #

maskRef :: Lens' Rectangle (Last ElementRef) Source #

preRendered :: Lens' Rectangle (Maybe String) Source #

strokeColor :: Lens' Rectangle (Last Texture) Source #

strokeDashArray :: Lens' Rectangle (Last [Number]) Source #

strokeLineCap :: Lens' Rectangle (Last Cap) Source #

strokeLineJoin :: Lens' Rectangle (Last LineJoin) Source #

strokeMiterLimit :: Lens' Rectangle (Last Double) Source #

strokeOffset :: Lens' Rectangle (Last Number) Source #

strokeOpacity :: Lens' Rectangle (Maybe Float) Source #

strokeWidth :: Lens' Rectangle (Last Number) Source #

textAnchor :: Lens' Rectangle (Last TextAnchor) Source #

transform :: Lens' Rectangle (Maybe [Transformation]) Source #

type Rep Rectangle Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Rectangle = D1 (MetaData "Rectangle" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Rectangle" PrefixI True) ((S1 (MetaSel (Just "_rectDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_rectUpperLeftCorner") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Point)) :*: (S1 (MetaSel (Just "_rectWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Number)) :*: (S1 (MetaSel (Just "_rectHeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Number)) :*: S1 (MetaSel (Just "_rectCornerRadius") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Number, Maybe Number))))))

Line

data Line Source #

Define a simple line. Correspond to the `<line>` tag.

Constructors

Line 

Fields

Instances
Eq Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Line -> ShowS #

show :: Line -> String #

showList :: [Line] -> ShowS #

Generic Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Line :: Type -> Type #

Methods

from :: Line -> Rep Line x #

to :: Rep Line x -> Line #

Hashable Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Line -> Int #

hash :: Line -> Int #

WithDefaultSvg Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasLine Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Line Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Line = D1 (MetaData "Line" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Line" PrefixI True) (S1 (MetaSel (Just "_lineDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_linePoint1") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Point) :*: S1 (MetaSel (Just "_linePoint2") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Point))))

Polygon

data Polygon Source #

Primitive decriving polygon composed of segements. Correspond to the `<polygon>` tag

Constructors

Polygon 

Fields

Instances
Eq Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Polygon :: Type -> Type #

Methods

from :: Polygon -> Rep Polygon x #

to :: Rep Polygon x -> Polygon #

Hashable Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Polygon -> Int #

hash :: Polygon -> Int #

WithDefaultSvg Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasPolygon Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Polygon Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Polygon = D1 (MetaData "Polygon" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Polygon" PrefixI True) (S1 (MetaSel (Just "_polygonDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_polygonPoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [RPoint])))

Polyline

data PolyLine Source #

This primitive describe an unclosed suite of segments. Correspond to the `<polyline>` tag.

Constructors

PolyLine 

Fields

Instances
Eq PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep PolyLine :: Type -> Type #

Methods

from :: PolyLine -> Rep PolyLine x #

to :: Rep PolyLine x -> PolyLine #

Hashable PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> PolyLine -> Int #

hash :: PolyLine -> Int #

WithDefaultSvg PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasPolyLine PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PolyLine Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PolyLine = D1 (MetaData "PolyLine" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "PolyLine" PrefixI True) (S1 (MetaSel (Just "_polyLineDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_polyLinePoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [RPoint])))

Path

data Path Source #

Type mapping the `<path>` svg tag.

Constructors

Path 

Fields

Instances
Eq Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Path -> ShowS #

show :: Path -> String #

showList :: [Path] -> ShowS #

Generic Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Path :: Type -> Type #

Methods

from :: Path -> Rep Path x #

to :: Rep Path x -> Path #

Hashable Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Path -> Int #

hash :: Path -> Int #

WithDefaultSvg Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasPath Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Path Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Path = D1 (MetaData "Path" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Path" PrefixI True) (S1 (MetaSel (Just "_pathDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_pathDefinition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [PathCommand])))

class HasPath c_alhy where Source #

Lenses for the Path type

Minimal complete definition

path

Circle

data Circle Source #

Define a `<circle>`.

Constructors

Circle 

Fields

Instances
Eq Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Circle :: Type -> Type #

Methods

from :: Circle -> Rep Circle x #

to :: Rep Circle x -> Circle #

Hashable Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Circle -> Int #

hash :: Circle -> Int #

WithDefaultSvg Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasCircle Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Circle Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Circle = D1 (MetaData "Circle" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Circle" PrefixI True) (S1 (MetaSel (Just "_circleDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_circleCenter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Point) :*: S1 (MetaSel (Just "_circleRadius") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number))))

Ellipse

data Ellipse Source #

Define an `<ellipse>`

Constructors

Ellipse 

Fields

Instances
Eq Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Ellipse :: Type -> Type #

Methods

from :: Ellipse -> Rep Ellipse x #

to :: Rep Ellipse x -> Ellipse #

Hashable Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Ellipse -> Int #

hash :: Ellipse -> Int #

WithDefaultSvg Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasEllipse Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Ellipse Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Ellipse = D1 (MetaData "Ellipse" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Ellipse" PrefixI True) ((S1 (MetaSel (Just "_ellipseDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_ellipseCenter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Point)) :*: (S1 (MetaSel (Just "_ellipseXRadius") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number) :*: S1 (MetaSel (Just "_ellipseYRadius") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number))))

Mesh (gradient mesh)

data GradientPathCommand Source #

Description of path used in meshgradient tag

Constructors

GLine !Origin !(Maybe RPoint)

Line to, L or l Svg path command.

GCurve !Origin !RPoint !RPoint !(Maybe RPoint)

Cubic bezier, C or c command

GClose

Z command

Instances
Eq GradientPathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show GradientPathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic GradientPathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep GradientPathCommand :: Type -> Type #

Hashable GradientPathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep GradientPathCommand Source # 
Instance details

Defined in Graphics.SvgTree.Types

data MeshGradientType Source #

Instances
Eq MeshGradientType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MeshGradientType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MeshGradientType Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MeshGradientType :: Type -> Type #

Hashable MeshGradientType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientType Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientType = D1 (MetaData "MeshGradientType" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "GradientBilinear" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GradientBicubic" PrefixI False) (U1 :: Type -> Type))

data MeshGradient Source #

Define a `<meshgradient>` tag.

Constructors

MeshGradient 

Fields

Instances
Eq MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MeshGradient :: Type -> Type #

Hashable MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasMeshGradient MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' MeshGradient DrawAttributes Source #

attrClass :: Lens' MeshGradient [Text] Source #

attrId :: Lens' MeshGradient (Maybe String) Source #

clipPathRef :: Lens' MeshGradient (Last ElementRef) Source #

clipRule :: Lens' MeshGradient (Last FillRule) Source #

fillColor :: Lens' MeshGradient (Last Texture) Source #

fillOpacity :: Lens' MeshGradient (Maybe Float) Source #

fillRule :: Lens' MeshGradient (Last FillRule) Source #

filterRef :: Lens' MeshGradient (Last ElementRef) Source #

fontFamily :: Lens' MeshGradient (Last [String]) Source #

fontSize :: Lens' MeshGradient (Last Number) Source #

fontStyle :: Lens' MeshGradient (Last FontStyle) Source #

groupOpacity :: Lens' MeshGradient (Maybe Float) Source #

markerEnd :: Lens' MeshGradient (Last ElementRef) Source #

markerMid :: Lens' MeshGradient (Last ElementRef) Source #

markerStart :: Lens' MeshGradient (Last ElementRef) Source #

maskRef :: Lens' MeshGradient (Last ElementRef) Source #

preRendered :: Lens' MeshGradient (Maybe String) Source #

strokeColor :: Lens' MeshGradient (Last Texture) Source #

strokeDashArray :: Lens' MeshGradient (Last [Number]) Source #

strokeLineCap :: Lens' MeshGradient (Last Cap) Source #

strokeLineJoin :: Lens' MeshGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' MeshGradient (Last Double) Source #

strokeOffset :: Lens' MeshGradient (Last Number) Source #

strokeOpacity :: Lens' MeshGradient (Maybe Float) Source #

strokeWidth :: Lens' MeshGradient (Last Number) Source #

textAnchor :: Lens' MeshGradient (Last TextAnchor) Source #

transform :: Lens' MeshGradient (Maybe [Transformation]) Source #

type Rep MeshGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradient = D1 (MetaData "MeshGradient" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "MeshGradient" PrefixI True) ((S1 (MetaSel (Just "_meshGradientDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_meshGradientX") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number) :*: S1 (MetaSel (Just "_meshGradientY") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number))) :*: ((S1 (MetaSel (Just "_meshGradientType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 MeshGradientType) :*: S1 (MetaSel (Just "_meshGradientUnits") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 CoordinateUnits)) :*: (S1 (MetaSel (Just "_meshGradientTransform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Transformation]) :*: S1 (MetaSel (Just "_meshGradientRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [MeshGradientRow])))))

data MeshGradientRow Source #

Define a `<meshrow>` tag.

Constructors

MeshGradientRow 

Fields

Instances
Eq MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MeshGradientRow :: Type -> Type #

Hashable MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasMeshGradientRow MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientRow Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientRow = D1 (MetaData "MeshGradientRow" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "MeshGradientRow" PrefixI True) (S1 (MetaSel (Just "_meshGradientRowPatches") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [MeshGradientPatch])))

data MeshGradientPatch Source #

Define `<meshpatch>` SVG tag

Constructors

MeshGradientPatch 

Fields

Instances
Eq MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MeshGradientPatch :: Type -> Type #

Hashable MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasMeshGradientPatch MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientPatch Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeshGradientPatch = D1 (MetaData "MeshGradientPatch" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "MeshGradientPatch" PrefixI True) (S1 (MetaSel (Just "_meshGradientPatchStops") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [GradientStop])))

Image

data Image Source #

Define an `<image>` tag.

Constructors

Image 

Fields

Instances
Eq Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Image -> ShowS #

show :: Image -> String #

showList :: [Image] -> ShowS #

Generic Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Image :: Type -> Type #

Methods

from :: Image -> Rep Image x #

to :: Rep Image x -> Image #

Hashable Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Image -> Int #

hash :: Image -> Int #

WithDefaultSvg Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasImage Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Image Source # 
Instance details

Defined in Graphics.SvgTree.Types

Use

data Use Source #

Define an `<use>` for a named content. Every named content can be reused in the document using this element.

Constructors

Use 

Fields

Instances
Eq Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Use -> ShowS #

show :: Use -> String #

showList :: [Use] -> ShowS #

Generic Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Use :: Type -> Type #

Methods

from :: Use -> Rep Use x #

to :: Rep Use x -> Use #

Hashable Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Use -> Int #

hash :: Use -> Int #

WithDefaultSvg Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasUse Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Use Source # 
Instance details

Defined in Graphics.SvgTree.Types

Grouping primitives

Group

data Group a Source #

Define a SVG group, corresponding `<g>` tag.

Constructors

Group 

Fields

Instances
Eq a => Eq (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

(==) :: Group a -> Group a -> Bool #

(/=) :: Group a -> Group a -> Bool #

Show a => Show (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Group a -> ShowS #

show :: Group a -> String #

showList :: [Group a] -> ShowS #

Generic (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep (Group a) :: Type -> Type #

Methods

from :: Group a -> Rep (Group a) x #

to :: Rep (Group a) x -> Group a #

Hashable a => Hashable (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Group a -> Int #

hash :: Group a -> Int #

WithDefaultSvg (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

defaultSvg :: Group a Source #

HasDrawAttributes (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Group a) DrawAttributes Source #

attrClass :: Lens' (Group a) [Text] Source #

attrId :: Lens' (Group a) (Maybe String) Source #

clipPathRef :: Lens' (Group a) (Last ElementRef) Source #

clipRule :: Lens' (Group a) (Last FillRule) Source #

fillColor :: Lens' (Group a) (Last Texture) Source #

fillOpacity :: Lens' (Group a) (Maybe Float) Source #

fillRule :: Lens' (Group a) (Last FillRule) Source #

filterRef :: Lens' (Group a) (Last ElementRef) Source #

fontFamily :: Lens' (Group a) (Last [String]) Source #

fontSize :: Lens' (Group a) (Last Number) Source #

fontStyle :: Lens' (Group a) (Last FontStyle) Source #

groupOpacity :: Lens' (Group a) (Maybe Float) Source #

markerEnd :: Lens' (Group a) (Last ElementRef) Source #

markerMid :: Lens' (Group a) (Last ElementRef) Source #

markerStart :: Lens' (Group a) (Last ElementRef) Source #

maskRef :: Lens' (Group a) (Last ElementRef) Source #

preRendered :: Lens' (Group a) (Maybe String) Source #

strokeColor :: Lens' (Group a) (Last Texture) Source #

strokeDashArray :: Lens' (Group a) (Last [Number]) Source #

strokeLineCap :: Lens' (Group a) (Last Cap) Source #

strokeLineJoin :: Lens' (Group a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Group a) (Last Double) Source #

strokeOffset :: Lens' (Group a) (Last Number) Source #

strokeOpacity :: Lens' (Group a) (Maybe Float) Source #

strokeWidth :: Lens' (Group a) (Last Number) Source #

textAnchor :: Lens' (Group a) (Last TextAnchor) Source #

transform :: Lens' (Group a) (Maybe [Transformation]) Source #

HasGroup (Group a) a Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Group a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Group a) = D1 (MetaData "Group" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Group" PrefixI True) ((S1 (MetaSel (Just "_groupDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_groupChildren") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [a])) :*: (S1 (MetaSel (Just "_groupViewBox") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Double, Double, Double, Double))) :*: S1 (MetaSel (Just "_groupAspectRatio") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 PreserveAspectRatio))))

class HasGroup g a | g -> a where Source #

Lenses associated to the Group type.

Minimal complete definition

group

Symbol

newtype Symbol a Source #

Define the `<symbol>` tag, equivalent to a hidden named group.

Constructors

Symbol 

Fields

Instances
Eq a => Eq (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

(==) :: Symbol a -> Symbol a -> Bool #

(/=) :: Symbol a -> Symbol a -> Bool #

Show a => Show (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Symbol a -> ShowS #

show :: Symbol a -> String #

showList :: [Symbol a] -> ShowS #

Generic (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep (Symbol a) :: Type -> Type #

Methods

from :: Symbol a -> Rep (Symbol a) x #

to :: Rep (Symbol a) x -> Symbol a #

Hashable a => Hashable (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Symbol a -> Int #

hash :: Symbol a -> Int #

WithDefaultSvg (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Symbol a) DrawAttributes Source #

attrClass :: Lens' (Symbol a) [Text] Source #

attrId :: Lens' (Symbol a) (Maybe String) Source #

clipPathRef :: Lens' (Symbol a) (Last ElementRef) Source #

clipRule :: Lens' (Symbol a) (Last FillRule) Source #

fillColor :: Lens' (Symbol a) (Last Texture) Source #

fillOpacity :: Lens' (Symbol a) (Maybe Float) Source #

fillRule :: Lens' (Symbol a) (Last FillRule) Source #

filterRef :: Lens' (Symbol a) (Last ElementRef) Source #

fontFamily :: Lens' (Symbol a) (Last [String]) Source #

fontSize :: Lens' (Symbol a) (Last Number) Source #

fontStyle :: Lens' (Symbol a) (Last FontStyle) Source #

groupOpacity :: Lens' (Symbol a) (Maybe Float) Source #

markerEnd :: Lens' (Symbol a) (Last ElementRef) Source #

markerMid :: Lens' (Symbol a) (Last ElementRef) Source #

markerStart :: Lens' (Symbol a) (Last ElementRef) Source #

maskRef :: Lens' (Symbol a) (Last ElementRef) Source #

preRendered :: Lens' (Symbol a) (Maybe String) Source #

strokeColor :: Lens' (Symbol a) (Last Texture) Source #

strokeDashArray :: Lens' (Symbol a) (Last [Number]) Source #

strokeLineCap :: Lens' (Symbol a) (Last Cap) Source #

strokeLineJoin :: Lens' (Symbol a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Symbol a) (Last Double) Source #

strokeOffset :: Lens' (Symbol a) (Last Number) Source #

strokeOpacity :: Lens' (Symbol a) (Maybe Float) Source #

strokeWidth :: Lens' (Symbol a) (Last Number) Source #

textAnchor :: Lens' (Symbol a) (Last TextAnchor) Source #

transform :: Lens' (Symbol a) (Maybe [Transformation]) Source #

HasGroup (Symbol a) a Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Symbol a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Symbol a) = D1 (MetaData "Symbol" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" True) (C1 (MetaCons "Symbol" PrefixI True) (S1 (MetaSel (Just "_groupOfSymbol") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Group a))))

groupOfSymbol :: Lens (Symbol s) (Symbol t) (Group s) (Group t) Source #

Lenses associated with the Symbol type.

Definitions

newtype Definitions a Source #

Define the `<defs>` tag, equivalent to a named symbol.

Constructors

Definitions 
Instances
Eq a => Eq (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show a => Show (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep (Definitions a) :: Type -> Type #

Methods

from :: Definitions a -> Rep (Definitions a) x #

to :: Rep (Definitions a) x -> Definitions a #

Hashable a => Hashable (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Definitions a -> Int #

hash :: Definitions a -> Int #

WithDefaultSvg (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' (Definitions a) DrawAttributes Source #

attrClass :: Lens' (Definitions a) [Text] Source #

attrId :: Lens' (Definitions a) (Maybe String) Source #

clipPathRef :: Lens' (Definitions a) (Last ElementRef) Source #

clipRule :: Lens' (Definitions a) (Last FillRule) Source #

fillColor :: Lens' (Definitions a) (Last Texture) Source #

fillOpacity :: Lens' (Definitions a) (Maybe Float) Source #

fillRule :: Lens' (Definitions a) (Last FillRule) Source #

filterRef :: Lens' (Definitions a) (Last ElementRef) Source #

fontFamily :: Lens' (Definitions a) (Last [String]) Source #

fontSize :: Lens' (Definitions a) (Last Number) Source #

fontStyle :: Lens' (Definitions a) (Last FontStyle) Source #

groupOpacity :: Lens' (Definitions a) (Maybe Float) Source #

markerEnd :: Lens' (Definitions a) (Last ElementRef) Source #

markerMid :: Lens' (Definitions a) (Last ElementRef) Source #

markerStart :: Lens' (Definitions a) (Last ElementRef) Source #

maskRef :: Lens' (Definitions a) (Last ElementRef) Source #

preRendered :: Lens' (Definitions a) (Maybe String) Source #

strokeColor :: Lens' (Definitions a) (Last Texture) Source #

strokeDashArray :: Lens' (Definitions a) (Last [Number]) Source #

strokeLineCap :: Lens' (Definitions a) (Last Cap) Source #

strokeLineJoin :: Lens' (Definitions a) (Last LineJoin) Source #

strokeMiterLimit :: Lens' (Definitions a) (Last Double) Source #

strokeOffset :: Lens' (Definitions a) (Last Number) Source #

strokeOpacity :: Lens' (Definitions a) (Maybe Float) Source #

strokeWidth :: Lens' (Definitions a) (Last Number) Source #

textAnchor :: Lens' (Definitions a) (Last TextAnchor) Source #

transform :: Lens' (Definitions a) (Maybe [Transformation]) Source #

HasGroup (Definitions a) a Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Definitions a) Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep (Definitions a) = D1 (MetaData "Definitions" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" True) (C1 (MetaCons "Definitions" PrefixI True) (S1 (MetaSel (Just "_groupOfDefinitions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Group a))))

groupOfDefinitions :: Lens (Definitions s) (Definitions t) (Group s) (Group t) Source #

Lenses associated with the Definitions type.

Filter

data Filter Source #

Define the `<filter>` tag.

Instances
Eq Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Filter :: Type -> Type #

Methods

from :: Filter -> Rep Filter x #

to :: Rep Filter x -> Filter #

Hashable Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Filter -> Int #

hash :: Filter -> Int #

WithDefaultSvg Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasFilterAttributes Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Filter Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Filter = D1 (MetaData "Filter" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Filter" PrefixI True) (S1 (MetaSel (Just "_filterDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_filterSelfAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FilterAttributes) :*: S1 (MetaSel (Just "_filterChildren") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [FilterElement]))))

Text related types

Text

data Text Source #

Define the global `<tag>` SVG tag.

Constructors

Text 

Fields

Instances
Eq Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Text -> ShowS #

show :: Text -> String #

showList :: [Text] -> ShowS #

Generic Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Text :: Type -> Type #

Methods

from :: Text -> Rep Text x #

to :: Rep Text x -> Text #

Hashable Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

WithDefaultSvg Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasText Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Text Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Text = D1 (MetaData "Text" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Text" PrefixI True) (S1 (MetaSel (Just "_textAdjust") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TextAdjust) :*: S1 (MetaSel (Just "_textRoot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TextSpan)))

class HasText c_aorD where Source #

Lenses for the Text type.

Minimal complete definition

text

data TextAnchor Source #

Tell where to anchor the text, where the position given is realative to the text.

Constructors

TextAnchorStart

The text with left aligned, or start at the postion If the point is the * then the text will be printed this way:

 *THE_TEXT_TO_PRINT

Equivalent to the start value.

TextAnchorMiddle

The text is middle aligned, so the text will be at the left and right of the position:

  THE_TEXT*TO_PRINT

Equivalent to the middle value.

TextAnchorEnd

The text is right aligned.

  THE_TEXT_TO_PRINT*

Equivalent to the end value.

Instances
Eq TextAnchor Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextAnchor Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextAnchor Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextAnchor :: Type -> Type #

Hashable TextAnchor Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextAnchor Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextAnchor = D1 (MetaData "TextAnchor" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextAnchorStart" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TextAnchorMiddle" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextAnchorEnd" PrefixI False) (U1 :: Type -> Type)))

textAt :: Point -> Text -> Text Source #

Little helper to create a SVG text at a given baseline position.

Text path

data TextPath Source #

Describe the `<textpath>` SVG tag.

Constructors

TextPath 

Fields

Instances
Eq TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextPath :: Type -> Type #

Methods

from :: TextPath -> Rep TextPath x #

to :: Rep TextPath x -> TextPath #

Hashable TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> TextPath -> Int #

hash :: TextPath -> Int #

WithDefaultSvg TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasTextPath TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPath = D1 (MetaData "TextPath" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextPath" PrefixI True) ((S1 (MetaSel (Just "_textPathStartOffset") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Number) :*: S1 (MetaSel (Just "_textPathName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String)) :*: (S1 (MetaSel (Just "_textPathMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TextPathMethod) :*: S1 (MetaSel (Just "_textPathSpacing") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TextPathSpacing))))

data TextPathSpacing Source #

Describe the content of the spacing text path attribute.

Constructors

TextPathSpacingExact

Map to the exact value.

TextPathSpacingAuto

Map to the auto value.

Instances
Eq TextPathSpacing Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextPathSpacing Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextPathSpacing Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextPathSpacing :: Type -> Type #

Hashable TextPathSpacing Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPathSpacing Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPathSpacing = D1 (MetaData "TextPathSpacing" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextPathSpacingExact" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextPathSpacingAuto" PrefixI False) (U1 :: Type -> Type))

data TextPathMethod Source #

Describe the content of the method attribute on text path.

Constructors

TextPathAlign

Map to the align value.

TextPathStretch

Map to the stretch value.

Instances
Eq TextPathMethod Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextPathMethod Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextPathMethod Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextPathMethod :: Type -> Type #

Hashable TextPathMethod Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPathMethod Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextPathMethod = D1 (MetaData "TextPathMethod" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextPathAlign" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextPathStretch" PrefixI False) (U1 :: Type -> Type))

Text span.

data TextSpanContent Source #

Define the content of a `<tspan>` tag.

Constructors

SpanText !Text

Raw text

SpanTextRef !String

Equivalent to a `<tref>`

SpanSub !TextSpan

Define a `<tspan>`

data TextSpan Source #

Define a `<tspan>` tag.

Constructors

TextSpan 

Fields

Instances
Eq TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextSpan :: Type -> Type #

Methods

from :: TextSpan -> Rep TextSpan x #

to :: Rep TextSpan x -> TextSpan #

Hashable TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> TextSpan -> Int #

hash :: TextSpan -> Int #

WithDefaultSvg TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasTextSpan TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextSpan Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextSpan = D1 (MetaData "TextSpan" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextSpan" PrefixI True) (S1 (MetaSel (Just "_spanInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TextInfo) :*: (S1 (MetaSel (Just "_spanDrawAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_spanContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [TextSpanContent]))))

data TextInfo Source #

Define position information associated to `<text>` or `<tspan>` svg tag.

Constructors

TextInfo 

Fields

Instances
Eq TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextInfo :: Type -> Type #

Methods

from :: TextInfo -> Rep TextInfo x #

to :: Rep TextInfo x -> TextInfo #

Semigroup TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Monoid TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Hashable TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> TextInfo -> Int #

hash :: TextInfo -> Int #

WithDefaultSvg TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasTextInfo TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextInfo Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextInfo = D1 (MetaData "TextInfo" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextInfo" PrefixI True) ((S1 (MetaSel (Just "_textInfoX") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Number]) :*: (S1 (MetaSel (Just "_textInfoY") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Number]) :*: S1 (MetaSel (Just "_textInfoDX") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Number]))) :*: (S1 (MetaSel (Just "_textInfoDY") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Number]) :*: (S1 (MetaSel (Just "_textInfoRotate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Double]) :*: S1 (MetaSel (Just "_textInfoLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Number))))))

data TextAdjust Source #

Define the possible values of the lengthAdjust attribute.

Constructors

TextAdjustSpacing

Value spacing

TextAdjustSpacingAndGlyphs

Value spacingAndGlyphs

Instances
Eq TextAdjust Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show TextAdjust Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic TextAdjust Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep TextAdjust :: Type -> Type #

Hashable TextAdjust Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextAdjust Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep TextAdjust = D1 (MetaData "TextAdjust" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "TextAdjustSpacing" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextAdjustSpacingAndGlyphs" PrefixI False) (U1 :: Type -> Type))

Marker definition

data Marker Source #

Define the `<marker>` tag.

Constructors

Marker 

Fields

Instances
Eq Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Marker :: Type -> Type #

Methods

from :: Marker -> Rep Marker x #

to :: Rep Marker x -> Marker #

Hashable Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Marker -> Int #

hash :: Marker -> Int #

WithDefaultSvg Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasMarker Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Marker Source # 
Instance details

Defined in Graphics.SvgTree.Types

data Overflow Source #

Define the content of the markerUnits attribute on the Marker.

Constructors

OverflowVisible

Value visible

OverflowHidden

Value hidden

Instances
Eq Overflow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Overflow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Overflow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Overflow :: Type -> Type #

Methods

from :: Overflow -> Rep Overflow x #

to :: Rep Overflow x -> Overflow #

Hashable Overflow Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Overflow -> Int #

hash :: Overflow -> Int #

type Rep Overflow Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Overflow = D1 (MetaData "Overflow" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "OverflowVisible" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OverflowHidden" PrefixI False) (U1 :: Type -> Type))

data MarkerOrientation Source #

Define the orientation, associated to the orient attribute on the Marker

Constructors

OrientationAuto

Auto value

OrientationAngle Coord

Specific angle.

Instances
Eq MarkerOrientation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MarkerOrientation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MarkerOrientation Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MarkerOrientation :: Type -> Type #

Hashable MarkerOrientation Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MarkerOrientation Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MarkerOrientation = D1 (MetaData "MarkerOrientation" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "OrientationAuto" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OrientationAngle" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Coord)))

data MarkerUnit Source #

Define the content of the markerUnits attribute on the Marker.

Constructors

MarkerUnitStrokeWidth

Value strokeWidth

MarkerUnitUserSpaceOnUse

Value userSpaceOnUse

Instances
Eq MarkerUnit Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MarkerUnit Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MarkerUnit Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MarkerUnit :: Type -> Type #

Hashable MarkerUnit Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MarkerUnit Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MarkerUnit = D1 (MetaData "MarkerUnit" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "MarkerUnitStrokeWidth" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MarkerUnitUserSpaceOnUse" PrefixI False) (U1 :: Type -> Type))

Gradient definition

data GradientStop Source #

Define a color stop for the gradients. Represent the `<stop>` SVG tag.

Constructors

GradientStop 

Fields

Instances
Eq GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep GradientStop :: Type -> Type #

Hashable GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasGradientStop GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep GradientStop Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep GradientStop = D1 (MetaData "GradientStop" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "GradientStop" PrefixI True) ((S1 (MetaSel (Just "_gradientOffset") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Float) :*: S1 (MetaSel (Just "_gradientColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 PixelRGBA8)) :*: (S1 (MetaSel (Just "_gradientPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GradientPathCommand)) :*: S1 (MetaSel (Just "_gradientOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Float)))))

Linear Gradient

data LinearGradient Source #

Define a `<linearGradient>` tag.

Constructors

LinearGradient 

Fields

Instances
Eq LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep LinearGradient :: Type -> Type #

Hashable LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasLinearGradient LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' LinearGradient DrawAttributes Source #

attrClass :: Lens' LinearGradient [Text] Source #

attrId :: Lens' LinearGradient (Maybe String) Source #

clipPathRef :: Lens' LinearGradient (Last ElementRef) Source #

clipRule :: Lens' LinearGradient (Last FillRule) Source #

fillColor :: Lens' LinearGradient (Last Texture) Source #

fillOpacity :: Lens' LinearGradient (Maybe Float) Source #

fillRule :: Lens' LinearGradient (Last FillRule) Source #

filterRef :: Lens' LinearGradient (Last ElementRef) Source #

fontFamily :: Lens' LinearGradient (Last [String]) Source #

fontSize :: Lens' LinearGradient (Last Number) Source #

fontStyle :: Lens' LinearGradient (Last FontStyle) Source #

groupOpacity :: Lens' LinearGradient (Maybe Float) Source #

markerEnd :: Lens' LinearGradient (Last ElementRef) Source #

markerMid :: Lens' LinearGradient (Last ElementRef) Source #

markerStart :: Lens' LinearGradient (Last ElementRef) Source #

maskRef :: Lens' LinearGradient (Last ElementRef) Source #

preRendered :: Lens' LinearGradient (Maybe String) Source #

strokeColor :: Lens' LinearGradient (Last Texture) Source #

strokeDashArray :: Lens' LinearGradient (Last [Number]) Source #

strokeLineCap :: Lens' LinearGradient (Last Cap) Source #

strokeLineJoin :: Lens' LinearGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' LinearGradient (Last Double) Source #

strokeOffset :: Lens' LinearGradient (Last Number) Source #

strokeOpacity :: Lens' LinearGradient (Maybe Float) Source #

strokeWidth :: Lens' LinearGradient (Last Number) Source #

textAnchor :: Lens' LinearGradient (Last TextAnchor) Source #

transform :: Lens' LinearGradient (Maybe [Transformation]) Source #

type Rep LinearGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep LinearGradient = D1 (MetaData "LinearGradient" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "LinearGradient" PrefixI True) ((S1 (MetaSel (Just "_linearGradientDrawAttributes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_linearGradientUnits") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CoordinateUnits) :*: S1 (MetaSel (Just "_linearGradientStart") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Point))) :*: ((S1 (MetaSel (Just "_linearGradientStop") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Point) :*: S1 (MetaSel (Just "_linearGradientSpread") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Spread)) :*: (S1 (MetaSel (Just "_linearGradientTransform") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Transformation]) :*: S1 (MetaSel (Just "_linearGradientStops") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [GradientStop])))))

Radial Gradient

data RadialGradient Source #

Define a `<radialGradient>` tag.

Constructors

RadialGradient 

Fields

Instances
Eq RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep RadialGradient :: Type -> Type #

Hashable RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasRadialGradient RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

drawAttributes :: Lens' RadialGradient DrawAttributes Source #

attrClass :: Lens' RadialGradient [Text] Source #

attrId :: Lens' RadialGradient (Maybe String) Source #

clipPathRef :: Lens' RadialGradient (Last ElementRef) Source #

clipRule :: Lens' RadialGradient (Last FillRule) Source #

fillColor :: Lens' RadialGradient (Last Texture) Source #

fillOpacity :: Lens' RadialGradient (Maybe Float) Source #

fillRule :: Lens' RadialGradient (Last FillRule) Source #

filterRef :: Lens' RadialGradient (Last ElementRef) Source #

fontFamily :: Lens' RadialGradient (Last [String]) Source #

fontSize :: Lens' RadialGradient (Last Number) Source #

fontStyle :: Lens' RadialGradient (Last FontStyle) Source #

groupOpacity :: Lens' RadialGradient (Maybe Float) Source #

markerEnd :: Lens' RadialGradient (Last ElementRef) Source #

markerMid :: Lens' RadialGradient (Last ElementRef) Source #

markerStart :: Lens' RadialGradient (Last ElementRef) Source #

maskRef :: Lens' RadialGradient (Last ElementRef) Source #

preRendered :: Lens' RadialGradient (Maybe String) Source #

strokeColor :: Lens' RadialGradient (Last Texture) Source #

strokeDashArray :: Lens' RadialGradient (Last [Number]) Source #

strokeLineCap :: Lens' RadialGradient (Last Cap) Source #

strokeLineJoin :: Lens' RadialGradient (Last LineJoin) Source #

strokeMiterLimit :: Lens' RadialGradient (Last Double) Source #

strokeOffset :: Lens' RadialGradient (Last Number) Source #

strokeOpacity :: Lens' RadialGradient (Maybe Float) Source #

strokeWidth :: Lens' RadialGradient (Last Number) Source #

textAnchor :: Lens' RadialGradient (Last TextAnchor) Source #

transform :: Lens' RadialGradient (Maybe [Transformation]) Source #

type Rep RadialGradient Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep RadialGradient = D1 (MetaData "RadialGradient" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "RadialGradient" PrefixI True) (((S1 (MetaSel (Just "_radialGradientDrawAttributes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DrawAttributes) :*: S1 (MetaSel (Just "_radialGradientUnits") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CoordinateUnits)) :*: (S1 (MetaSel (Just "_radialGradientCenter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Point) :*: S1 (MetaSel (Just "_radialGradientRadius") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Number))) :*: ((S1 (MetaSel (Just "_radialGradientFocusX") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Number)) :*: S1 (MetaSel (Just "_radialGradientFocusY") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Number))) :*: (S1 (MetaSel (Just "_radialGradientSpread") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Spread) :*: (S1 (MetaSel (Just "_radialGradientTransform") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Transformation]) :*: S1 (MetaSel (Just "_radialGradientStops") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [GradientStop]))))))

Pattern definition

data Pattern Source #

Define a `<pattern>` tag.

Constructors

Pattern 

Fields

Instances
Eq Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Pattern :: Type -> Type #

Methods

from :: Pattern -> Rep Pattern x #

to :: Rep Pattern x -> Pattern #

Hashable Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Pattern -> Int #

hash :: Pattern -> Int #

WithDefaultSvg Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasPattern Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Pattern Source # 
Instance details

Defined in Graphics.SvgTree.Types

Mask definition

data Mask Source #

Define a SVG `<mask>` tag.

Constructors

Mask 

Fields

Instances
Eq Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

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

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

Show Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

showsPrec :: Int -> Mask -> ShowS #

show :: Mask -> String #

showList :: [Mask] -> ShowS #

Generic Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Mask :: Type -> Type #

Methods

from :: Mask -> Rep Mask x #

to :: Rep Mask x -> Mask #

Hashable Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> Mask -> Int #

hash :: Mask -> Int #

WithDefaultSvg Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasMask Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Mask Source # 
Instance details

Defined in Graphics.SvgTree.Types

Clip path definition

data ClipPath Source #

Define a `<clipPath>` tag.

Constructors

ClipPath 

Fields

Instances
Eq ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep ClipPath :: Type -> Type #

Methods

from :: ClipPath -> Rep ClipPath x #

to :: Rep ClipPath x -> ClipPath #

Hashable ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

Methods

hashWithSalt :: Int -> ClipPath -> Int #

hash :: ClipPath -> Int #

WithDefaultSvg ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasClipPath ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasDrawAttributes ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ClipPath Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep ClipPath = D1 (MetaData "ClipPath" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "ClipPath" PrefixI True) (S1 (MetaSel (Just "_clipPathDrawAttributes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DrawAttributes) :*: (S1 (MetaSel (Just "_clipPathUnits") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CoordinateUnits) :*: S1 (MetaSel (Just "_clipPathContent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Tree]))))

Aspect Ratio description

data PreserveAspectRatio Source #

Describe the content of the preserveAspectRatio attribute.

Instances
Eq PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep PreserveAspectRatio :: Type -> Type #

Hashable PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

WithDefaultSvg PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

HasPreserveAspectRatio PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PreserveAspectRatio Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep PreserveAspectRatio = D1 (MetaData "PreserveAspectRatio" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "PreserveAspectRatio" PrefixI True) (S1 (MetaSel (Just "_aspectRatioDefer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Bool) :*: (S1 (MetaSel (Just "_aspectRatioAlign") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Alignment) :*: S1 (MetaSel (Just "_aspectRatioMeetSlice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MeetSlice)))))

data Alignment Source #

This type represent the align information of the preserveAspectRatio SVGattribute

Constructors

AlignNone

"none" value

AlignxMinYMin 
AlignxMidYMin

"xMidYMin" value

AlignxMaxYMin

"xMaxYMin" value

AlignxMinYMid

"xMinYMid" value

AlignxMidYMid

"xMidYMid" value

AlignxMaxYMid

"xMaxYMid" value

AlignxMinYMax

"xMinYMax" value

AlignxMidYMax

"xMidYMax" value

AlignxMaxYMax

"xMaxYMax" value

Instances
Eq Alignment Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show Alignment Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic Alignment Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep Alignment :: Type -> Type #

Hashable Alignment Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Alignment Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep Alignment = D1 (MetaData "Alignment" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (((C1 (MetaCons "AlignNone" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AlignxMinYMin" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "AlignxMidYMin" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AlignxMaxYMin" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AlignxMinYMid" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "AlignxMidYMid" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AlignxMaxYMid" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "AlignxMinYMax" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AlignxMidYMax" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AlignxMaxYMax" PrefixI False) (U1 :: Type -> Type)))))

data MeetSlice Source #

This type represent the "meet or slice" information of the preserveAspectRatio SVGattribute

Constructors

Meet 
Slice 
Instances
Eq MeetSlice Source # 
Instance details

Defined in Graphics.SvgTree.Types

Show MeetSlice Source # 
Instance details

Defined in Graphics.SvgTree.Types

Generic MeetSlice Source # 
Instance details

Defined in Graphics.SvgTree.Types

Associated Types

type Rep MeetSlice :: Type -> Type #

Hashable MeetSlice Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeetSlice Source # 
Instance details

Defined in Graphics.SvgTree.Types

type Rep MeetSlice = D1 (MetaData "MeetSlice" "Graphics.SvgTree.Types" "reanimate-svg-0.10.3.0-wmWAd93mJIHZHcZ144ZdW" False) (C1 (MetaCons "Meet" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Slice" PrefixI False) (U1 :: Type -> Type))

MISC functions

isPathArc :: PathCommand -> Bool Source #

Tell if the path command is an EllipticalArc.

isPathWithArc :: Foldable f => f PathCommand -> Bool Source #

Tell if a full path contain an EllipticalArc.

nameOfTree :: Tree -> Text Source #

For every element of a svg tree, associate it's SVG tag name.

zipTree :: ([[Tree]] -> Tree) -> Tree -> Tree Source #

Map a tree while propagating context information. The function passed in parameter receive a list representing the the path used to go arrive to the current node.

mapTree :: (Tree -> Tree) -> Tree -> Tree Source #

Helper function mapping every tree element.

foldTree :: (a -> Tree -> a) -> a -> Tree -> a Source #

Fold all nodes of a SVG tree.

toUserUnit :: Dpi -> Number -> Number Source #

This function replace all device dependant units to user units given it's DPI configuration. Preserve percentage and "em" notation.

mapNumber :: (Double -> Double) -> Number -> Number Source #

Helper function to modify inner value of a number

Orphan instances

Generic PixelRGBA8 Source # 
Instance details

Associated Types

type Rep PixelRGBA8 :: Type -> Type #

Hashable PixelRGBA8 Source # 
Instance details

Hashable a => Hashable (Last a) Source # 
Instance details

Methods

hashWithSalt :: Int -> Last a -> Int #

hash :: Last a -> Int #