| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Potato.Flow.OwlState
Synopsis
- maybeGetAttachmentPosition :: HasCallStack => Bool -> OwlPFState -> Attachment -> Maybe XY
 - maybeGetAttachmentBox :: Bool -> OwlPFState -> Attachment -> Maybe LBox
 - maybeLookupAttachment :: HasCallStack => Bool -> OwlPFState -> Maybe Attachment -> Maybe XY
 - data OwlPFState = OwlPFState {}
 - owlPFState_prettyPrintForDebugging :: OwlPFState -> Text
 - owlPFState_nextId :: OwlPFState -> REltId
 - owlPFState_lastId :: OwlPFState -> REltId
 - owlPFState_numElts :: OwlPFState -> Int
 - debugPrintOwlPFState :: IsString a => OwlPFState -> a
 - owlPFState_isValid :: OwlPFState -> Bool
 - owlPFState_selectionIsValid :: OwlPFState -> OwlParliament -> Bool
 - owlPFState_copyElts :: OwlPFState -> OwlParliament -> [SEltLabel]
 - owlPFState_getSuperOwls :: OwlPFState -> [REltId] -> REltIdMap (Maybe SuperOwl)
 - emptyOwlPFState :: OwlPFState
 - sPotatoFlow_to_owlPFState :: SPotatoFlow -> OwlPFState
 - owlPFState_to_sPotatoFlow :: OwlPFState -> SPotatoFlow
 - owlPFState_toCanvasCoordinates :: OwlPFState -> XY -> XY
 - owlPFState_fromCanvasCoordinates :: OwlPFState -> XY -> XY
 - owlPFState_to_SuperOwlParliament :: OwlPFState -> SuperOwlParliament
 - do_newElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_newElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - do_deleteElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_deleteElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - do_newMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_newMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - do_deleteMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_deleteMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - isSuperOwlParliamentUndoFriendly :: SuperOwlParliament -> Bool
 - do_move :: (OwlSpot, SuperOwlParliament) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_move :: (OwlSpot, SuperOwlParliament) -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - updateFnFromControllerOwl :: Bool -> Controller -> (OwlItemMeta, OwlItem) -> (OwlItemMeta, OwlItem)
 - manipulate :: Bool -> ControllersWithId -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - do_manipulate :: ControllersWithId -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - undo_manipulate :: ControllersWithId -> OwlPFState -> (OwlPFState, SuperOwlChanges)
 - isValidCanvas :: SCanvas -> Bool
 - do_resizeCanvas :: DeltaLBox -> OwlPFState -> OwlPFState
 - undo_resizeCanvas :: DeltaLBox -> OwlPFState -> OwlPFState
 
Documentation
maybeGetAttachmentPosition :: HasCallStack => Bool -> OwlPFState -> Attachment -> Maybe XY Source #
maybeGetAttachmentBox :: Bool -> OwlPFState -> Attachment -> Maybe LBox Source #
maybeLookupAttachment :: HasCallStack => Bool -> OwlPFState -> Maybe Attachment -> Maybe XY Source #
data OwlPFState Source #
Constructors
| OwlPFState | |
Fields  | |
Instances
owlPFState_nextId :: OwlPFState -> REltId Source #
owlPFState_lastId :: OwlPFState -> REltId Source #
owlPFState_numElts :: OwlPFState -> Int Source #
debugPrintOwlPFState :: IsString a => OwlPFState -> a Source #
owlPFState_isValid :: OwlPFState -> Bool Source #
owlPFState_copyElts :: OwlPFState -> OwlParliament -> [SEltLabel] Source #
owlPFState_getSuperOwls :: OwlPFState -> [REltId] -> REltIdMap (Maybe SuperOwl) Source #
owlPFState_toCanvasCoordinates :: OwlPFState -> XY -> XY Source #
owlPFState_fromCanvasCoordinates :: OwlPFState -> XY -> XY Source #
do_newElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
undo_newElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
do_deleteElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
undo_deleteElts :: [(REltId, OwlSpot, OwlItem)] -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
do_newMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
undo_newMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
do_deleteMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
undo_deleteMiniOwlTree :: (MiniOwlTree, OwlSpot) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
do_move :: (OwlSpot, SuperOwlParliament) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
undo_move :: (OwlSpot, SuperOwlParliament) -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
updateFnFromControllerOwl :: Bool -> Controller -> (OwlItemMeta, OwlItem) -> (OwlItemMeta, OwlItem) Source #
manipulate :: Bool -> ControllersWithId -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
do_manipulate :: ControllersWithId -> OwlPFState -> (OwlPFState, SuperOwlChanges) Source #
isValidCanvas :: SCanvas -> Bool Source #
check if the SCanvas is valid or not for now, canvas offset must always be 0, I forget why it's even an option to offset the SCanvas, probably potatoes.
do_resizeCanvas :: DeltaLBox -> OwlPFState -> OwlPFState Source #
undo_resizeCanvas :: DeltaLBox -> OwlPFState -> OwlPFState Source #