web-rep-0.7.0: representations of a web page

Safe HaskellNone
LanguageHaskell2010

Web.Rep.Examples

Synopsis

Documentation

page1 :: Page Source #

simple page example

page2 :: Page Source #

page with localised libraries

pagemj :: Page Source #

simple mathjax formulae

data RepExamples Source #

One of each sharedrep input instances.

Instances
Eq RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

Show RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

Generic RepExamples Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep RepExamples :: Type -> Type #

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
Eq Shape Source # 
Instance details

Defined in Web.Rep.Examples

Methods

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

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

Show Shape Source # 
Instance details

Defined in Web.Rep.Examples

Methods

showsPrec :: Int -> Shape -> ShowS #

show :: Shape -> String #

showList :: [Shape] -> ShowS #

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 #

type Rep Shape Source # 
Instance details

Defined in Web.Rep.Examples

type Rep Shape = D1 (MetaData "Shape" "Web.Rep.Examples" "web-rep-0.7.0-FbnLiBhVUXzFOFUBGflJ1L" 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
Eq SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

Show SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

Generic SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

Associated Types

type Rep SumTypeExample :: Type -> Type #

type Rep SumTypeExample Source # 
Instance details

Defined in Web.Rep.Examples

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