pandora-0.5.5: A box of patterns and paradigms
Safe HaskellSafe-Inferred
LanguageHaskell2010

Pandora.Paradigm.Structure.Interface.Zipper

Documentation

class Zippable (structure :: * -> *) where Source #

Associated Types

type Breadcrumbs structure :: * -> * Source #

Methods

fasten :: structure e -> Maybe > Zipper structure e Source #

unfasten :: Zipper structure e -> Nonempty structure e Source #

Instances

Instances details
Zippable List Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.List

Associated Types

type Breadcrumbs List :: Type -> Type Source #

Zippable Rose Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.Rose

Associated Types

type Breadcrumbs Rose :: Type -> Type Source #

Zippable Binary Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.Binary

Associated Types

type Breadcrumbs Binary :: Type -> Type Source #

Zippable (Construction Exactly) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.Stream

Associated Types

type Breadcrumbs (Construction Exactly) :: Type -> Type Source #

Zippable (Comprehension Maybe) Source # 
Instance details

Defined in Pandora.Paradigm.Structure.Some.List

Associated Types

type Breadcrumbs (Comprehension Maybe) :: Type -> Type Source #

type Zipper (structure :: * -> *) = Exactly <:*:> Breadcrumbs structure Source #

Orphan instances

Semimonoidal (<--) (:*:) (:*:) t => Monoidal (<--) (-->) (:*:) (:*:) (Exactly <:*:> t) Source # 
Instance details

Methods

unit :: Proxy (:*:) -> (Unit (:*:) --> a) <-- (Exactly <:*:> t) a Source #

Semimonoidal (<--) (:*:) (:*:) t => Semimonoidal (<--) (:*:) (:*:) (Exactly <:*:> t :: Type -> Type) Source # 
Instance details

Methods

mult :: forall (a :: k) (b :: k). ((Exactly <:*:> t) a :*: (Exactly <:*:> t) b) <-- (Exactly <:*:> t) (a :*: b) Source #