web-rep-0.10.1: representations of a web page
Safe HaskellSafe-Inferred
LanguageHaskell2010

Web.Rep.Examples

Synopsis

Documentation

page1 :: Page Source #

simple page example

page2 :: Page Source #

page with localised libraries

data RepExamples Source #

One of each sharedrep input instances.

Instances

Instances details
Generic RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep RepExamples :: Type -> Type #

Show RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

Eq RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

type Rep RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

repExamples :: Monad m => SharedRep m RepExamples Source #

one of each input SharedReps

data Shape Source #

For a typed dropdown example.

Constructors

SquareShape 
CircleShape 

Instances

Instances details
Generic Shape Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep Shape :: Type -> Type #

Methods

from :: Shape -> Rep Shape x #

to :: Rep Shape x -> Shape #

Show Shape Source # 
Instance details

Defined in Web.Rep.Examples

Methods

showsPrec :: Int -> Shape -> ShowS #

show :: Shape -> String #

showList :: [Shape] -> ShowS #

Eq Shape Source # 
Instance details

Defined in Web.Rep.Examples

Methods

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

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

type Rep Shape Source # 
Instance details

Defined in Web.Rep.Examples

type Rep Shape = D1 ('MetaData "Shape" "Web.Rep.Examples" "web-rep-0.10.1-IsL1Sc2Kv7hBdkd4T3gPsn" 'False) (C1 ('MetaCons "SquareShape" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CircleShape" 'PrefixI 'False) (U1 :: Type -> Type))

fromShape :: Shape -> Text Source #

shape printer

toShape :: Text -> Shape Source #

shape parser

data SumTypeExample Source #

Constructors

SumInt Int 
SumOnly 
SumText Text 

Instances

Instances details
Generic SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep SumTypeExample :: Type -> Type #

Show SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

Eq SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

type Rep SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

type Rep SumTypeExample = D1 ('MetaData "SumTypeExample" "Web.Rep.Examples" "web-rep-0.10.1-IsL1Sc2Kv7hBdkd4T3gPsn" 'False) (C1 ('MetaCons "SumInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: (C1 ('MetaCons "SumOnly" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SumText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))))

data SumType2Example Source #

Instances

Instances details
Generic SumType2Example Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep SumType2Example :: Type -> Type #

Show SumType2Example Source # 
Instance details

Defined in Web.Rep.Examples

Eq SumType2Example Source # 
Instance details

Defined in Web.Rep.Examples

type Rep SumType2Example Source # 
Instance details

Defined in Web.Rep.Examples

type Rep SumType2Example = D1 ('MetaData "SumType2Example" "Web.Rep.Examples" "web-rep-0.10.1-IsL1Sc2Kv7hBdkd4T3gPsn" 'False) (C1 ('MetaCons "SumOutside" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "SumInside" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SumTypeExample)))