Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- type REltId = Int
- type PChar = Char
- type MPChar = Maybe PChar
- getPCharWidth :: Char -> Int8
- data FillStyle
- data SuperStyle = SuperStyle {}
- superStyle_fromListFormat :: [PChar] -> SuperStyle
- superStyle_toListFormat :: SuperStyle -> [PChar]
- data TextAlign
- convertTextAlignToTextZipperTextAlignment :: TextAlign -> TextAlignment
- data TextStyle = TextStyle {}
- data AttachmentLocation
- type AttachmentOffsetRatio = Ratio Int
- data Attachment = Attachment {}
- attachment_offset_rel_default :: Ratio Int
- attachment_create_default :: REltId -> AttachmentLocation -> Attachment
- data SBoxTitle = SBoxTitle {}
- data SBoxText = SBoxText {}
- data SBoxType
- sBoxType_isText :: SBoxType -> Bool
- sBoxType_hasBorder :: SBoxType -> Bool
- make_sBoxType :: Bool -> Bool -> SBoxType
- data SBox = SBox {}
- sBox_hasLabel :: SBox -> Bool
- data LineAutoStyle
- data LineStyle = LineStyle {}
- lineStyle_fromListFormat :: ([PChar], [PChar], [PChar], [PChar]) -> LineStyle
- lineStyle_toListFormat :: LineStyle -> ([PChar], [PChar], [PChar], [PChar])
- data SAutoLineConstraint = SAutoLineConstraintFixed XY
- data SAutoLineLabelPosition = SAutoLineLabelPositionRelative Float
- data SAutoLineLabel = SAutoLineLabel {}
- data SAutoLine = SAutoLine {
- _sAutoLine_start :: XY
- _sAutoLine_end :: XY
- _sAutoLine_superStyle :: SuperStyle
- _sAutoLine_lineStyle :: LineStyle
- _sAutoLine_lineStyleEnd :: LineStyle
- _sAutoLine_attachStart :: Maybe Attachment
- _sAutoLine_attachEnd :: Maybe Attachment
- _sAutoLine_midpoints :: [SAutoLineConstraint]
- _sAutoLine_labels :: [SAutoLineLabel]
- data SCartLines = SCartLines {}
- type TextAreaMapping = Map XY PChar
- data STextArea = STextArea {}
- data SElt
- data SEltLabel = SEltLabel {}
Documentation
getPCharWidth :: Char -> Int8 Source #
Instances
FromJSON FillStyle Source # | |
ToJSON FillStyle Source # | |
Defined in Potato.Flow.SElts | |
Generic FillStyle Source # | |
Show FillStyle Source # | |
Binary FillStyle Source # | |
Default FillStyle Source # | |
Defined in Potato.Flow.SElts | |
NFData FillStyle Source # | |
Defined in Potato.Flow.SElts | |
Eq FillStyle Source # | |
type Rep FillStyle Source # | |
Defined in Potato.Flow.SElts type Rep FillStyle = D1 ('MetaData "FillStyle" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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
superStyle_fromListFormat :: [PChar] -> SuperStyle Source #
superStyle_toListFormat :: SuperStyle -> [PChar] Source #
Instances
FromJSON TextAlign Source # | |
ToJSON TextAlign Source # | |
Defined in Potato.Flow.SElts | |
Generic TextAlign Source # | |
Show TextAlign Source # | |
Binary TextAlign Source # | |
Default TextAlign Source # | |
Defined in Potato.Flow.SElts | |
NFData TextAlign Source # | |
Defined in Potato.Flow.SElts | |
Eq TextAlign Source # | |
Delta TextAlign DeltaTextAlign Source # | |
Defined in Potato.Flow.Types plusDelta :: TextAlign -> DeltaTextAlign -> TextAlign Source # minusDelta :: TextAlign -> DeltaTextAlign -> TextAlign Source # | |
type Rep TextAlign Source # | |
Defined in Potato.Flow.SElts type Rep TextAlign = D1 ('MetaData "TextAlign" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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))) |
Instances
FromJSON TextStyle Source # | |
ToJSON TextStyle Source # | |
Defined in Potato.Flow.SElts | |
Generic TextStyle Source # | |
Show TextStyle Source # | |
Binary TextStyle Source # | |
Default TextStyle Source # | |
Defined in Potato.Flow.SElts | |
NFData TextStyle Source # | |
Defined in Potato.Flow.SElts | |
Eq TextStyle Source # | |
Delta TextStyle DeltaTextStyle Source # | |
Defined in Potato.Flow.Types plusDelta :: TextStyle -> DeltaTextStyle -> TextStyle Source # minusDelta :: TextStyle -> DeltaTextStyle -> TextStyle Source # | |
type Rep TextStyle Source # | |
Defined in Potato.Flow.SElts |
data AttachmentLocation Source #
Instances
type AttachmentOffsetRatio = Ratio Int Source #
data Attachment Source #
Instances
Instances
FromJSON SBoxTitle Source # | |
ToJSON SBoxTitle Source # | |
Defined in Potato.Flow.SElts | |
Generic SBoxTitle Source # | |
Show SBoxTitle Source # | |
Binary SBoxTitle Source # | |
Default SBoxTitle Source # | |
Defined in Potato.Flow.SElts | |
NFData SBoxTitle Source # | |
Defined in Potato.Flow.SElts | |
Eq SBoxTitle Source # | |
type Rep SBoxTitle Source # | |
Defined in Potato.Flow.SElts type Rep SBoxTitle = D1 ('MetaData "SBoxTitle" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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))) |
Instances
FromJSON SBoxText Source # | |
ToJSON SBoxText Source # | |
Defined in Potato.Flow.SElts | |
Generic SBoxText Source # | |
Show SBoxText Source # | |
Binary SBoxText Source # | |
Default SBoxText Source # | |
Defined in Potato.Flow.SElts | |
NFData SBoxText Source # | |
Defined in Potato.Flow.SElts | |
Eq SBoxText Source # | |
Delta SBoxText CBoxText Source # | |
type Rep SBoxText Source # | |
Defined in Potato.Flow.SElts type Rep SBoxText = D1 ('MetaData "SBoxText" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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))) |
Instances
FromJSON SBoxType Source # | |
ToJSON SBoxType Source # | |
Defined in Potato.Flow.SElts | |
Generic SBoxType Source # | |
Show SBoxType Source # | |
Binary SBoxType Source # | |
Default SBoxType Source # | |
Defined in Potato.Flow.SElts | |
NFData SBoxType Source # | |
Defined in Potato.Flow.SElts | |
Eq SBoxType Source # | |
type Rep SBoxType Source # | |
Defined in Potato.Flow.SElts type Rep SBoxType = D1 ('MetaData "SBoxType" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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))) |
sBoxType_isText :: SBoxType -> Bool Source #
sBoxType_hasBorder :: SBoxType -> Bool Source #
Instances
sBox_hasLabel :: SBox -> Bool Source #
data LineAutoStyle Source #
LineAutoStyle_Auto | |
LineAutoStyle_AutoStraight | |
LineAutoStyle_StraightAlwaysHorizontal | |
LineAutoStyle_StraightAlwaysVertical |
Instances
Instances
data SAutoLineConstraint Source #
Instances
data SAutoLineLabelPosition Source #
Instances
data SAutoLineLabel Source #
Instances
Instances
data SCartLines Source #
Instances
abitrary text confined to a box
Instances
FromJSON STextArea Source # | |
ToJSON STextArea Source # | |
Defined in Potato.Flow.SElts | |
Generic STextArea Source # | |
Show STextArea Source # | |
Binary STextArea Source # | |
Default STextArea Source # | |
Defined in Potato.Flow.SElts | |
NFData STextArea Source # | |
Defined in Potato.Flow.SElts | |
Eq STextArea Source # | |
type Rep STextArea Source # | |
Defined in Potato.Flow.SElts type Rep STextArea = D1 ('MetaData "STextArea" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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)))) |
Instances
Instances
FromJSON SEltLabel Source # | |
ToJSON SEltLabel Source # | |
Defined in Potato.Flow.SElts | |
Generic SEltLabel Source # | |
Show SEltLabel Source # | |
Binary SEltLabel Source # | |
NFData SEltLabel Source # | |
Defined in Potato.Flow.SElts | |
Eq SEltLabel Source # | |
Delta SEltLabel CRename Source # | |
type Rep SEltLabel Source # | |
Defined in Potato.Flow.SElts type Rep SEltLabel = D1 ('MetaData "SEltLabel" "Potato.Flow.SElts" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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))) |