tinytools-0.1.0.4: tinytools is a mono-space unicode diagram editor
Safe HaskellSafe-Inferred
LanguageHaskell2010

Potato.Flow.Preview

Documentation

data Shepard Source #

Constructors

Shepard Int 

Instances

Instances details
Generic Shepard Source # 
Instance details

Defined in Potato.Flow.Preview

Associated Types

type Rep Shepard :: Type -> Type #

Methods

from :: Shepard -> Rep Shepard x #

to :: Rep Shepard x -> Shepard #

Show Shepard Source # 
Instance details

Defined in Potato.Flow.Preview

NFData Shepard Source # 
Instance details

Defined in Potato.Flow.Preview

Methods

rnf :: Shepard -> () #

Eq Shepard Source # 
Instance details

Defined in Potato.Flow.Preview

Methods

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

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

type Rep Shepard Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep Shepard = D1 ('MetaData "Shepard" "Potato.Flow.Preview" "tinytools-0.1.0.4-CdnuAZWvpktBAieawv8rrp" 'False) (C1 ('MetaCons "Shepard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data Shift Source #

Constructors

Shift Int 

Instances

Instances details
Generic Shift Source # 
Instance details

Defined in Potato.Flow.Preview

Associated Types

type Rep Shift :: Type -> Type #

Methods

from :: Shift -> Rep Shift x #

to :: Rep Shift x -> Shift #

Show Shift Source # 
Instance details

Defined in Potato.Flow.Preview

Methods

showsPrec :: Int -> Shift -> ShowS #

show :: Shift -> String #

showList :: [Shift] -> ShowS #

NFData Shift Source # 
Instance details

Defined in Potato.Flow.Preview

Methods

rnf :: Shift -> () #

Eq Shift Source # 
Instance details

Defined in Potato.Flow.Preview

Methods

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

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

type Rep Shift Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep Shift = D1 ('MetaData "Shift" "Potato.Flow.Preview" "tinytools-0.1.0.4-CdnuAZWvpktBAieawv8rrp" 'False) (C1 ('MetaCons "Shift" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data PreviewOperation Source #

Instances

Instances details
Generic PreviewOperation Source # 
Instance details

Defined in Potato.Flow.Preview

Associated Types

type Rep PreviewOperation :: Type -> Type #

Show PreviewOperation Source # 
Instance details

Defined in Potato.Flow.Preview

Eq PreviewOperation Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep PreviewOperation Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep PreviewOperation = D1 ('MetaData "PreviewOperation" "Potato.Flow.Preview" "tinytools-0.1.0.4-CdnuAZWvpktBAieawv8rrp" 'False) ((C1 ('MetaCons "PO_Start" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PO_CommitAndStart" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PO_StartAndCommit" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PO_Continue" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PO_ContinueAndCommit" 'PrefixI 'False) (U1 :: Type -> Type))))

data Preview Source #

Instances

Instances details
Generic Preview Source # 
Instance details

Defined in Potato.Flow.Preview

Associated Types

type Rep Preview :: Type -> Type #

Methods

from :: Preview -> Rep Preview x #

to :: Rep Preview x -> Preview #

Show Preview Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep Preview Source # 
Instance details

Defined in Potato.Flow.Preview

type Rep Preview = D1 ('MetaData "Preview" "Potato.Flow.Preview" "tinytools-0.1.0.4-CdnuAZWvpktBAieawv8rrp" 'False) (C1 ('MetaCons "Preview" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PreviewOperation) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Llama)) :+: (C1 ('MetaCons "Preview_Commit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Preview_Cancel" 'PrefixI 'False) (U1 :: Type -> Type)))