tinytools-0.1.0.3
Safe HaskellSafe-Inferred
LanguageHaskell2010

Potato.Flow.SElts

Synopsis

Documentation

data FillStyle Source #

Instances

Instances details
FromJSON FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep FillStyle :: Type -> Type #

Show FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Default FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: FillStyle #

NFData FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: FillStyle -> () #

Eq FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep FillStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep FillStyle = D1 ('MetaData "FillStyle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "FillStyle_Blank" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FillStyle_Simple" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PChar)))

data SuperStyle Source #

Instances

Instances details
FromJSON SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SuperStyle :: Type -> Type #

Show SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Default SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SuperStyle #

NFData SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SuperStyle -> () #

Eq SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Delta SuperStyle DeltaSuperStyle Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SuperStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SuperStyle = D1 ('MetaData "SuperStyle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SuperStyle" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_superStyle_tl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar) :*: S1 ('MetaSel ('Just "_superStyle_tr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar)) :*: (S1 ('MetaSel ('Just "_superStyle_bl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar) :*: S1 ('MetaSel ('Just "_superStyle_br") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar))) :*: ((S1 ('MetaSel ('Just "_superStyle_vertical") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar) :*: S1 ('MetaSel ('Just "_superStyle_horizontal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar)) :*: (S1 ('MetaSel ('Just "_superStyle_point") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MPChar) :*: S1 ('MetaSel ('Just "_superStyle_fill") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FillStyle)))))

data TextAlign Source #

 

Instances

Instances details
FromJSON TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Generic TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep TextAlign :: Type -> Type #

Show TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Binary TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Default TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: TextAlign #

NFData TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: TextAlign -> () #

Eq TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

Delta TextAlign DeltaTextAlign Source # 
Instance details

Defined in Potato.Flow.Types

type Rep TextAlign Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep TextAlign = D1 ('MetaData "TextAlign" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "TextAlign_Left" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TextAlign_Right" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TextAlign_Center" 'PrefixI 'False) (U1 :: Type -> Type)))

data TextStyle Source #

 

Constructors

TextStyle 

Instances

Instances details
FromJSON TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep TextStyle :: Type -> Type #

Show TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Default TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: TextStyle #

NFData TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: TextStyle -> () #

Eq TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Delta TextStyle DeltaTextStyle Source # 
Instance details

Defined in Potato.Flow.Types

type Rep TextStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep TextStyle = D1 ('MetaData "TextStyle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "TextStyle" 'PrefixI 'True) (S1 ('MetaSel ('Just "_textStyle_alignment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TextAlign)))

data AttachmentLocation Source #

Constructors

AL_Top 
AL_Bot 
AL_Left 
AL_Right 
AL_Any 

Instances

Instances details
FromJSON AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

Generic AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep AttachmentLocation :: Type -> Type #

Show AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

Binary AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

NFData AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: AttachmentLocation -> () #

Eq AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

TransformMe AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

type Rep AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep AttachmentLocation = D1 ('MetaData "AttachmentLocation" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) ((C1 ('MetaCons "AL_Top" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AL_Bot" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AL_Left" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AL_Right" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AL_Any" 'PrefixI 'False) (U1 :: Type -> Type))))

data Attachment Source #

Instances

Instances details
FromJSON Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

Generic Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep Attachment :: Type -> Type #

Show Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

Binary Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

NFData Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: Attachment -> () #

Eq Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep Attachment Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep Attachment = D1 ('MetaData "Attachment" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "Attachment" 'PrefixI 'True) (S1 ('MetaSel ('Just "_attachment_target") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 REltId) :*: (S1 ('MetaSel ('Just "_attachment_location") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AttachmentLocation) :*: S1 ('MetaSel ('Just "_attachment_offset_rel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AttachmentOffsetRatio))))

data SBoxTitle Source #

 

Instances

Instances details
FromJSON SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SBoxTitle :: Type -> Type #

Show SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Default SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SBoxTitle #

NFData SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SBoxTitle -> () #

Eq SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBoxTitle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBoxTitle = D1 ('MetaData "SBoxTitle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SBoxTitle" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sBoxTitle_title") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "_sBoxTitle_align") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TextAlign)))

data SBoxText Source #

 

Instances

Instances details
FromJSON SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SBoxText :: Type -> Type #

Methods

from :: SBoxText -> Rep SBoxText x #

to :: Rep SBoxText x -> SBoxText #

Show SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

put :: SBoxText -> Put #

get :: Get SBoxText #

putList :: [SBoxText] -> Put #

Default SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SBoxText #

NFData SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SBoxText -> () #

Eq SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

Delta SBoxText CBoxText Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SBoxText Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBoxText = D1 ('MetaData "SBoxText" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SBoxText" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sBoxText_text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "_sBoxText_style") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TextStyle)))

data SBoxType Source #

Instances

Instances details
FromJSON SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SBoxType :: Type -> Type #

Methods

from :: SBoxType -> Rep SBoxType x #

to :: Rep SBoxType x -> SBoxType #

Show SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

put :: SBoxType -> Put #

get :: Get SBoxType #

putList :: [SBoxType] -> Put #

Default SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SBoxType #

NFData SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SBoxType -> () #

Eq SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBoxType Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBoxType = D1 ('MetaData "SBoxType" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) ((C1 ('MetaCons "SBoxType_Box" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SBoxType_NoBox" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SBoxType_BoxText" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SBoxType_NoBoxText" 'PrefixI 'False) (U1 :: Type -> Type)))

data SBox Source #

 

Instances

Instances details
FromJSON SBox Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SBox :: Type -> Type #

Methods

from :: SBox -> Rep SBox x #

to :: Rep SBox x -> SBox #

Show SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

showsPrec :: Int -> SBox -> ShowS #

show :: SBox -> String #

showList :: [SBox] -> ShowS #

Binary SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

put :: SBox -> Put #

get :: Get SBox #

putList :: [SBox] -> Put #

Default SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SBox #

NFData SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SBox -> () #

Eq SBox Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

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

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

Delta SBox CBoxText Source # 
Instance details

Defined in Potato.Flow.Types

Delta SBox CBoxType Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SBox Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SBox = D1 ('MetaData "SBox" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SBox" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_sBox_box") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LBox) :*: S1 ('MetaSel ('Just "_sBox_superStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SuperStyle)) :*: (S1 ('MetaSel ('Just "_sBox_title") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SBoxTitle) :*: (S1 ('MetaSel ('Just "_sBox_text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SBoxText) :*: S1 ('MetaSel ('Just "_sBox_boxType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SBoxType)))))

data LineAutoStyle Source #

Instances

Instances details
FromJSON LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep LineAutoStyle :: Type -> Type #

Show LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Default LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: LineAutoStyle #

NFData LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: LineAutoStyle -> () #

Eq LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep LineAutoStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep LineAutoStyle = D1 ('MetaData "LineAutoStyle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) ((C1 ('MetaCons "LineAutoStyle_Auto" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineAutoStyle_AutoStraight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LineAutoStyle_StraightAlwaysHorizontal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineAutoStyle_StraightAlwaysVertical" 'PrefixI 'False) (U1 :: Type -> Type)))

data LineStyle Source #

Instances

Instances details
FromJSON LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Generic LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep LineStyle :: Type -> Type #

Show LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Binary LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Default LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: LineStyle #

NFData LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: LineStyle -> () #

Eq LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

Delta LineStyle DeltaLineStyle Source # 
Instance details

Defined in Potato.Flow.Types

type Rep LineStyle Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep LineStyle = D1 ('MetaData "LineStyle" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "LineStyle" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_lineStyle_leftArrows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "_lineStyle_rightArrows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "_lineStyle_upArrows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "_lineStyle_downArrows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SAutoLineConstraint Source #

Instances

Instances details
FromJSON SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SAutoLineConstraint :: Type -> Type #

Show SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

NFData SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SAutoLineConstraint -> () #

Eq SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineConstraint Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineConstraint = D1 ('MetaData "SAutoLineConstraint" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SAutoLineConstraintFixed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 XY)))

data SAutoLineLabelPosition Source #

Instances

Instances details
FromJSON SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SAutoLineLabelPosition :: Type -> Type #

Show SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

NFData SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SAutoLineLabelPosition -> () #

Eq SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineLabelPosition Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineLabelPosition = D1 ('MetaData "SAutoLineLabelPosition" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SAutoLineLabelPositionRelative" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Float)))

data SAutoLineLabel Source #

Instances

Instances details
FromJSON SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SAutoLineLabel :: Type -> Type #

Show SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Default SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SAutoLineLabel #

NFData SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SAutoLineLabel -> () #

Eq SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineLabel Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLineLabel = D1 ('MetaData "SAutoLineLabel" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SAutoLineLabel" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sAutoLineLabel_index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "_sAutoLineLabel_position") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SAutoLineLabelPosition) :*: S1 ('MetaSel ('Just "_sAutoLineLabel_text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SAutoLine Source #

 

Instances

Instances details
FromJSON SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SAutoLine :: Type -> Type #

Show SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Default SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: SAutoLine #

NFData SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SAutoLine -> () #

Eq SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

Delta SAutoLine CLine Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SAutoLine Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SAutoLine = D1 ('MetaData "SAutoLine" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SAutoLine" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_sAutoLine_start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 XY) :*: S1 ('MetaSel ('Just "_sAutoLine_end") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 XY)) :*: (S1 ('MetaSel ('Just "_sAutoLine_superStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SuperStyle) :*: S1 ('MetaSel ('Just "_sAutoLine_lineStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LineStyle))) :*: ((S1 ('MetaSel ('Just "_sAutoLine_lineStyleEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LineStyle) :*: S1 ('MetaSel ('Just "_sAutoLine_attachStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Attachment))) :*: (S1 ('MetaSel ('Just "_sAutoLine_attachEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Attachment)) :*: (S1 ('MetaSel ('Just "_sAutoLine_midpoints") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SAutoLineConstraint]) :*: S1 ('MetaSel ('Just "_sAutoLine_labels") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SAutoLineLabel]))))))

data SCartLines Source #

 

Instances

Instances details
FromJSON SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SCartLines :: Type -> Type #

Show SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

NFData SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SCartLines -> () #

Eq SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SCartLines Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SCartLines = D1 ('MetaData "SCartLines" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SCartLines" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sCartLines_start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 XY) :*: (S1 ('MetaSel ('Just "_sCartLines_ends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Either Int Int))) :*: S1 ('MetaSel ('Just "_sCartLines_style") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SuperStyle))))

data STextArea Source #

abitrary text confined to a box

Instances

Instances details
FromJSON STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Generic STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep STextArea :: Type -> Type #

Show STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Binary STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Default STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

def :: STextArea #

NFData STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: STextArea -> () #

Eq STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep STextArea Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep STextArea = D1 ('MetaData "STextArea" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "STextArea" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sTextArea_box") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LBox) :*: (S1 ('MetaSel ('Just "_sTextArea_text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TextAreaMapping) :*: S1 ('MetaSel ('Just "_sTextArea_transparent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

data SElt Source #

Instances

Instances details
FromJSON SElt Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SElt :: Type -> Type #

Methods

from :: SElt -> Rep SElt x #

to :: Rep SElt x -> SElt #

Show SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

showsPrec :: Int -> SElt -> ShowS #

show :: SElt -> String #

showList :: [SElt] -> ShowS #

Binary SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

put :: SElt -> Put #

get :: Get SElt #

putList :: [SElt] -> Put #

NFData SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SElt -> () #

Eq SElt Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

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

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

Delta SElt DeltaTextAreaToggle Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SElt Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SElt = D1 ('MetaData "SElt" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) ((C1 ('MetaCons "SEltNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SEltFolderStart" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SEltFolderEnd" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "SEltBox" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SBox)) :+: (C1 ('MetaCons "SEltLine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SAutoLine)) :+: C1 ('MetaCons "SEltTextArea" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 STextArea)))))

data SEltLabel Source #

Constructors

SEltLabel 

Instances

Instances details
FromJSON SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

ToJSON SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Generic SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Associated Types

type Rep SEltLabel :: Type -> Type #

Show SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Binary SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

NFData SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Methods

rnf :: SEltLabel -> () #

Eq SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

Delta SEltLabel CRename Source # 
Instance details

Defined in Potato.Flow.Types

type Rep SEltLabel Source # 
Instance details

Defined in Potato.Flow.SElts

type Rep SEltLabel = D1 ('MetaData "SEltLabel" "Potato.Flow.SElts" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "SEltLabel" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sEltLabel_name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "_sEltLabel_sElt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SElt)))