cursor-0.3.0.0: Purely Functional Cursors

Safe HaskellNone
LanguageHaskell2010

Cursor.Tree

Contents

Synopsis

Documentation

data TreeCursor a b Source #

Constructors

TreeCursor 

Fields

Instances
(Eq b, Eq a) => Eq (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

(==) :: TreeCursor a b -> TreeCursor a b -> Bool #

(/=) :: TreeCursor a b -> TreeCursor a b -> Bool #

(Show b, Show a) => Show (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

showsPrec :: Int -> TreeCursor a b -> ShowS #

show :: TreeCursor a b -> String #

showList :: [TreeCursor a b] -> ShowS #

Generic (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

Associated Types

type Rep (TreeCursor a b) :: Type -> Type #

Methods

from :: TreeCursor a b -> Rep (TreeCursor a b) x #

to :: Rep (TreeCursor a b) x -> TreeCursor a b #

(NFData a, NFData b) => NFData (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

rnf :: TreeCursor a b -> () #

(Validity a, Validity b) => Validity (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

validate :: TreeCursor a b -> Validation #

type Rep (TreeCursor a b) Source # 
Instance details

Defined in Cursor.Tree.Types

type Rep (TreeCursor a b) = D1 (MetaData "TreeCursor" "Cursor.Tree.Types" "cursor-0.3.0.0-4Hn80vYAl979Qxk54M4vdL" False) (C1 (MetaCons "TreeCursor" PrefixI True) (S1 (MetaSel (Just "treeAbove") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (TreeAbove b))) :*: (S1 (MetaSel (Just "treeCurrent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Just "treeBelow") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (CForest b)))))

data TreeAbove b Source #

Constructors

TreeAbove 
Instances
Functor TreeAbove Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

fmap :: (a -> b) -> TreeAbove a -> TreeAbove b #

(<$) :: a -> TreeAbove b -> TreeAbove a #

Eq b => Eq (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

(==) :: TreeAbove b -> TreeAbove b -> Bool #

(/=) :: TreeAbove b -> TreeAbove b -> Bool #

Show b => Show (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

Generic (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

Associated Types

type Rep (TreeAbove b) :: Type -> Type #

Methods

from :: TreeAbove b -> Rep (TreeAbove b) x #

to :: Rep (TreeAbove b) x -> TreeAbove b #

NFData b => NFData (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

Methods

rnf :: TreeAbove b -> () #

Validity b => Validity (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

type Rep (TreeAbove b) Source # 
Instance details

Defined in Cursor.Tree.Types

type Rep (TreeAbove b) = D1 (MetaData "TreeAbove" "Cursor.Tree.Types" "cursor-0.3.0.0-4Hn80vYAl979Qxk54M4vdL" False) (C1 (MetaCons "TreeAbove" PrefixI True) ((S1 (MetaSel (Just "treeAboveLefts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [CTree b]) :*: S1 (MetaSel (Just "treeAboveAbove") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (TreeAbove b)))) :*: (S1 (MetaSel (Just "treeAboveNode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 b) :*: S1 (MetaSel (Just "treeAboveRights") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [CTree b]))))

Types

Construction, destruction

Drawing

Collapsing

Movements

Insertions

Deletions

Swapping

Promotions

Demotions