Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- type REltIdMap a = IntMap a
- type ControllersWithId = IntMap Controller
- controllerWithId_isParams :: ControllersWithId -> Bool
- type AttachmentMap = REltIdMap IntSet
- type LayerPos = Int
- type SuperSEltLabel = (REltId, LayerPos, SEltLabel)
- type SEltLabelChanges = REltIdMap (Maybe SEltLabel)
- type SEltLabelChangesWithLayerPos = REltIdMap (Maybe (LayerPos, SEltLabel))
- type LayerPosMap = REltIdMap LayerPos
- data CRename = CRename {}
- data CLine = CLine {}
- data CBoxText = CBoxText {}
- data CBoxType = CBoxType (SBoxType, SBoxType)
- data CBoundingBox = CBoundingBox {}
- data CTag a where
- CTagRename :: CTag CRename
- CTagLine :: CTag CLine
- CTagBoxText :: CTag CBoxText
- CTagBoxType :: CTag CBoxType
- CTagBoxTextStyle :: CTag CTextStyle
- CTagBoxLabelAlignment :: CTag CTextAlign
- CTagBoxLabelText :: CTag CMaybeText
- CTagTextArea :: CTag CTextArea
- CTagTextAreaToggle :: CTag CTextAreaToggle
- CTagSuperStyle :: CTag CSuperStyle
- CTagLineStyle :: CTag CLineStyle
- CTagBoundingBox :: CTag CBoundingBox
- data CTextStyle = CTextStyle DeltaTextStyle
- data CSuperStyle = CSuperStyle DeltaSuperStyle
- data CLineStyle = CLineStyle DeltaLineStyle
- data CTextAlign = CTextAlign DeltaTextAlign
- data CMaybeText = CMaybeText DeltaMaybeText
- data CTextArea = CTextArea DeltaTextArea
- data CTextAreaToggle = CTextAreaToggle DeltaTextAreaToggle
- type Controller = DSum CTag Identity
- type DeltaText = (Text, Text)
- data DeltaSuperStyle = DeltaSuperStyle (SuperStyle, SuperStyle)
- data DeltaLineStyle = DeltaLineStyle (LineStyle, LineStyle)
- data DeltaTextStyle = DeltaTextStyle (TextStyle, TextStyle)
- data DeltaTextAlign = DeltaTextAlign (TextAlign, TextAlign)
- data DeltaMaybeText = DeltaMaybeText (Maybe Text, Maybe Text)
- data DeltaTextArea = DeltaTextArea (Map XY (Maybe PChar, Maybe PChar))
- data DeltaTextAreaToggle = DeltaTextAreaToggle SElt
- type SEltTree = [(REltId, SEltLabel)]
- data SCanvas = SCanvas {
- _sCanvas_box :: LBox
- data SPotatoFlow = SPotatoFlow {}
Documentation
type ControllersWithId = IntMap Controller Source #
indexed my REltId
type AttachmentMap = REltIdMap IntSet Source #
type LayerPosMap = REltIdMap LayerPos Source #
controllers
Instances
Generic CLine Source # | |
Show CLine Source # | |
Default CLine Source # | |
Defined in Potato.Flow.Types | |
NFData CLine Source # | |
Defined in Potato.Flow.Types | |
Eq CLine Source # | |
Delta SAutoLine CLine Source # | |
type Rep CLine Source # | |
Defined in Potato.Flow.Types type Rep CLine = D1 ('MetaData "CLine" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CLine" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_cLine_deltaStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DeltaXY)) :*: S1 ('MetaSel ('Just "_cLine_deltaEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DeltaXY))) :*: (S1 ('MetaSel ('Just "_cLine_deltaAttachStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe Attachment, Maybe Attachment))) :*: S1 ('MetaSel ('Just "_cLine_deltaAttachEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe Attachment, Maybe Attachment)))))) |
data CBoundingBox Source #
Instances
Generic CBoundingBox Source # | |
Defined in Potato.Flow.Types type Rep CBoundingBox :: Type -> Type # from :: CBoundingBox -> Rep CBoundingBox x # to :: Rep CBoundingBox x -> CBoundingBox # | |
Show CBoundingBox Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CBoundingBox -> ShowS # show :: CBoundingBox -> String # showList :: [CBoundingBox] -> ShowS # | |
NFData CBoundingBox Source # | |
Defined in Potato.Flow.Types rnf :: CBoundingBox -> () # | |
Eq CBoundingBox Source # | |
Defined in Potato.Flow.Types (==) :: CBoundingBox -> CBoundingBox -> Bool # (/=) :: CBoundingBox -> CBoundingBox -> Bool # | |
type Rep CBoundingBox Source # | |
Defined in Potato.Flow.Types type Rep CBoundingBox = D1 ('MetaData "CBoundingBox" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CBoundingBox" 'PrefixI 'True) (S1 ('MetaSel ('Just "_cBoundingBox_deltaBox") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaLBox))) |
Instances
NFData Controller Source # | |
Defined in Potato.Flow.Types rnf :: Controller -> () # | |
GCompare CTag Source # | |
GEq CTag Source # | |
GShow CTag Source # | |
Defined in Potato.Flow.Types gshowsPrec :: forall (a :: k). Int -> CTag a -> ShowS # | |
(c CRename, c CLine, c CBoxText, c CBoxType, c CTextStyle, c CTextAlign, c CMaybeText, c CTextArea, c CTextAreaToggle, c CSuperStyle, c CLineStyle, c CBoundingBox) => Has (c :: Type -> Constraint) CTag Source # | |
data CTextStyle Source #
Instances
Generic CTextStyle Source # | |
Defined in Potato.Flow.Types type Rep CTextStyle :: Type -> Type # from :: CTextStyle -> Rep CTextStyle x # to :: Rep CTextStyle x -> CTextStyle # | |
Show CTextStyle Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CTextStyle -> ShowS # show :: CTextStyle -> String # showList :: [CTextStyle] -> ShowS # | |
NFData CTextStyle Source # | |
Defined in Potato.Flow.Types rnf :: CTextStyle -> () # | |
Eq CTextStyle Source # | |
Defined in Potato.Flow.Types (==) :: CTextStyle -> CTextStyle -> Bool # (/=) :: CTextStyle -> CTextStyle -> Bool # | |
type Rep CTextStyle Source # | |
Defined in Potato.Flow.Types type Rep CTextStyle = D1 ('MetaData "CTextStyle" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CTextStyle" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaTextStyle))) |
data CSuperStyle Source #
Instances
Generic CSuperStyle Source # | |
Defined in Potato.Flow.Types type Rep CSuperStyle :: Type -> Type # from :: CSuperStyle -> Rep CSuperStyle x # to :: Rep CSuperStyle x -> CSuperStyle # | |
Show CSuperStyle Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CSuperStyle -> ShowS # show :: CSuperStyle -> String # showList :: [CSuperStyle] -> ShowS # | |
NFData CSuperStyle Source # | |
Defined in Potato.Flow.Types rnf :: CSuperStyle -> () # | |
Eq CSuperStyle Source # | |
Defined in Potato.Flow.Types (==) :: CSuperStyle -> CSuperStyle -> Bool # (/=) :: CSuperStyle -> CSuperStyle -> Bool # | |
type Rep CSuperStyle Source # | |
Defined in Potato.Flow.Types type Rep CSuperStyle = D1 ('MetaData "CSuperStyle" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CSuperStyle" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaSuperStyle))) |
data CLineStyle Source #
Instances
Generic CLineStyle Source # | |
Defined in Potato.Flow.Types type Rep CLineStyle :: Type -> Type # from :: CLineStyle -> Rep CLineStyle x # to :: Rep CLineStyle x -> CLineStyle # | |
Show CLineStyle Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CLineStyle -> ShowS # show :: CLineStyle -> String # showList :: [CLineStyle] -> ShowS # | |
NFData CLineStyle Source # | |
Defined in Potato.Flow.Types rnf :: CLineStyle -> () # | |
Eq CLineStyle Source # | |
Defined in Potato.Flow.Types (==) :: CLineStyle -> CLineStyle -> Bool # (/=) :: CLineStyle -> CLineStyle -> Bool # | |
type Rep CLineStyle Source # | |
Defined in Potato.Flow.Types type Rep CLineStyle = D1 ('MetaData "CLineStyle" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CLineStyle" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaLineStyle))) |
data CTextAlign Source #
Instances
Generic CTextAlign Source # | |
Defined in Potato.Flow.Types type Rep CTextAlign :: Type -> Type # from :: CTextAlign -> Rep CTextAlign x # to :: Rep CTextAlign x -> CTextAlign # | |
Show CTextAlign Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CTextAlign -> ShowS # show :: CTextAlign -> String # showList :: [CTextAlign] -> ShowS # | |
NFData CTextAlign Source # | |
Defined in Potato.Flow.Types rnf :: CTextAlign -> () # | |
Eq CTextAlign Source # | |
Defined in Potato.Flow.Types (==) :: CTextAlign -> CTextAlign -> Bool # (/=) :: CTextAlign -> CTextAlign -> Bool # | |
type Rep CTextAlign Source # | |
Defined in Potato.Flow.Types type Rep CTextAlign = D1 ('MetaData "CTextAlign" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CTextAlign" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaTextAlign))) |
data CMaybeText Source #
Instances
Generic CMaybeText Source # | |
Defined in Potato.Flow.Types type Rep CMaybeText :: Type -> Type # from :: CMaybeText -> Rep CMaybeText x # to :: Rep CMaybeText x -> CMaybeText # | |
Show CMaybeText Source # | |
Defined in Potato.Flow.Types showsPrec :: Int -> CMaybeText -> ShowS # show :: CMaybeText -> String # showList :: [CMaybeText] -> ShowS # | |
NFData CMaybeText Source # | |
Defined in Potato.Flow.Types rnf :: CMaybeText -> () # | |
Eq CMaybeText Source # | |
Defined in Potato.Flow.Types (==) :: CMaybeText -> CMaybeText -> Bool # (/=) :: CMaybeText -> CMaybeText -> Bool # | |
type Rep CMaybeText Source # | |
Defined in Potato.Flow.Types type Rep CMaybeText = D1 ('MetaData "CMaybeText" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CMaybeText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaMaybeText))) |
Instances
Generic CTextArea Source # | |
Show CTextArea Source # | |
NFData CTextArea Source # | |
Defined in Potato.Flow.Types | |
Eq CTextArea Source # | |
type Rep CTextArea Source # | |
Defined in Potato.Flow.Types type Rep CTextArea = D1 ('MetaData "CTextArea" "Potato.Flow.Types" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" 'False) (C1 ('MetaCons "CTextArea" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DeltaTextArea))) |
data CTextAreaToggle Source #
Instances
delta types
data DeltaSuperStyle Source #
Instances
data DeltaLineStyle Source #
Instances
data DeltaTextStyle Source #
Instances
data DeltaTextAlign Source #
Instances
data DeltaMaybeText Source #
Instances
data DeltaTextArea Source #
Instances
data DeltaTextAreaToggle Source #
Instances
serialized types
data SPotatoFlow Source #