Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- data CartDir
- data AnchorType
- flipCartDir :: CartDir -> CartDir
- cartDirToUnit :: CartDir -> XY
- cartDirToAnchor :: CartDir -> Maybe CartDir -> AnchorType
- cartDirWithDistanceToV2 :: (CartDir, Int, Bool) -> V2 Int
- data LineAnchorsForRender = LineAnchorsForRender {}
- matrix_cw_90 :: M22 Int
- matrix_ccw_90 :: M22 Int
- class TransformMe a where
- transformMe_rotateLeft :: a -> a
- transformMe_rotateRight :: a -> a
- transformMe_reflectHorizontally :: a -> a
- transformMe_reflectVertically :: a -> a
- data CartRotationReflection = CartRotationReflection {}
- cartRotationReflection_identity :: CartRotationReflection
- cartRotationReflection_invert :: CartRotationReflection -> CartRotationReflection
- cartRotationReflection_invert_apply :: TransformMe a => CartRotationReflection -> a -> a
- nTimes :: Int -> (a -> a) -> a -> a
- cartRotationReflection_apply :: TransformMe a => CartRotationReflection -> a -> a
Documentation
Instances
Generic CartDir Source # | |
Show CartDir Source # | |
NFData CartDir Source # | |
Defined in Potato.Flow.Methods.LineTypes | |
Eq CartDir Source # | |
TransformMe CartDir Source # | |
type Rep CartDir Source # | |
Defined in Potato.Flow.Methods.LineTypes type Rep CartDir = D1 ('MetaData "CartDir" "Potato.Flow.Methods.LineTypes" "tinytools-0.1.0.0-DrleRpyeSqeBtRJXQdRmv7" '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 AnchorType Source #
AT_End_Up | |
AT_End_Down | |
AT_End_Left | |
AT_End_Right | |
AT_Elbow_TL | |
AT_Elbow_TR | |
AT_Elbow_BR | |
AT_Elbow_BL | |
AT_Elbow_Invalid |
Instances
Show AnchorType Source # | |
Defined in Potato.Flow.Methods.LineTypes showsPrec :: Int -> AnchorType -> ShowS # show :: AnchorType -> String # showList :: [AnchorType] -> ShowS # | |
Eq AnchorType Source # | |
Defined in Potato.Flow.Methods.LineTypes (==) :: AnchorType -> AnchorType -> Bool # (/=) :: AnchorType -> AnchorType -> Bool # | |
TransformMe AnchorType Source # | |
flipCartDir :: CartDir -> CartDir Source #
cartDirToUnit :: CartDir -> XY Source #
cartDirToAnchor :: CartDir -> Maybe CartDir -> AnchorType Source #
data LineAnchorsForRender Source #
Instances
matrix_cw_90 :: M22 Int Source #
v +y
matrix_ccw_90 :: M22 Int Source #
class TransformMe a where Source #
Nothing
transformMe_rotateLeft :: a -> a Source #
transformMe_rotateRight :: a -> a Source #
transformMe_reflectHorizontally :: a -> a Source #
transformMe_reflectVertically :: a -> a Source #
Instances
data CartRotationReflection Source #
Instances
cartRotationReflection_invert_apply :: TransformMe a => CartRotationReflection -> a -> a Source #
cartRotationReflection_apply :: TransformMe a => CartRotationReflection -> a -> a Source #