tinytools-0.1.0.3
Safe HaskellSafe-Inferred
LanguageHaskell2010

Potato.Flow.Methods.LineTypes

Synopsis

Documentation

data CartDir Source #

Constructors

CD_Up 
CD_Down 
CD_Left 
CD_Right 

Instances

Instances details
Generic CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Associated Types

type Rep CartDir :: Type -> Type #

Methods

from :: CartDir -> Rep CartDir x #

to :: Rep CartDir x -> CartDir #

Show CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

NFData CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Methods

rnf :: CartDir -> () #

Eq CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Methods

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

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

TransformMe CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

type Rep CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

type Rep CartDir = D1 ('MetaData "CartDir" "Potato.Flow.Methods.LineTypes" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) ((C1 ('MetaCons "CD_Up" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CD_Down" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CD_Left" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CD_Right" 'PrefixI 'False) (U1 :: Type -> Type)))

data LineAnchorsForRender Source #

Instances

Instances details
Generic LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Associated Types

type Rep LineAnchorsForRender :: Type -> Type #

Show LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

NFData LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Methods

rnf :: LineAnchorsForRender -> () #

Eq LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

type Rep LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

type Rep LineAnchorsForRender = D1 ('MetaData "LineAnchorsForRender" "Potato.Flow.Methods.LineTypes" "tinytools-0.1.0.3-HF5s50ZrT30LQps3nQySnP" 'False) (C1 ('MetaCons "LineAnchorsForRender" 'PrefixI 'True) (S1 ('MetaSel ('Just "_lineAnchorsForRender_start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 XY) :*: S1 ('MetaSel ('Just "_lineAnchorsForRender_rest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(CartDir, Int, Bool)])))

class TransformMe a where Source #

Minimal complete definition

Nothing

Instances

Instances details
TransformMe LBox Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe XY Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe AnchorType Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe CartDir Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe CartRotationReflection Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe LineAnchorsForRender Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe AttachmentLocation Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

TransformMe AttachmentOffsetRatio Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

(TransformMe a, TransformMe b) => TransformMe (a, b) Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Methods

transformMe_rotateLeft :: (a, b) -> (a, b) Source #

transformMe_rotateRight :: (a, b) -> (a, b) Source #

transformMe_reflectHorizontally :: (a, b) -> (a, b) Source #

transformMe_reflectVertically :: (a, b) -> (a, b) Source #

(TransformMe a, TransformMe b, TransformMe c) => TransformMe (a, b, c) Source # 
Instance details

Defined in Potato.Flow.Methods.LineTypes

Methods

transformMe_rotateLeft :: (a, b, c) -> (a, b, c) Source #

transformMe_rotateRight :: (a, b, c) -> (a, b, c) Source #

transformMe_reflectHorizontally :: (a, b, c) -> (a, b, c) Source #

transformMe_reflectVertically :: (a, b, c) -> (a, b, c) Source #

nTimes :: Int -> (a -> a) -> a -> a Source #

Apply a function n times to a given value.