web-rep-0.4.0: representations of a web page

Safe HaskellNone
LanguageHaskell2010

Web.Page.Html.Input

Description

Common web page input elements, often with bootstrap scaffolding.

Synopsis

Documentation

data Input a Source #

something that might exist on a web page and be a front-end input to computations.

Constructors

Input 

Fields

Instances
Eq a => Eq (Input a) Source # 
Instance details

Defined in Web.Page.Html.Input

Methods

(==) :: Input a -> Input a -> Bool #

(/=) :: Input a -> Input a -> Bool #

Show a => Show (Input a) Source # 
Instance details

Defined in Web.Page.Html.Input

Methods

showsPrec :: Int -> Input a -> ShowS #

show :: Input a -> String #

showList :: [Input a] -> ShowS #

Generic (Input a) Source # 
Instance details

Defined in Web.Page.Html.Input

Associated Types

type Rep (Input a) :: Type -> Type #

Methods

from :: Input a -> Rep (Input a) x #

to :: Rep (Input a) x -> Input a #

ToHtml a => ToHtml (Input a) Source # 
Instance details

Defined in Web.Page.Html.Input

Methods

toHtml :: Monad m => Input a -> HtmlT m () #

toHtmlRaw :: Monad m => Input a -> HtmlT m () #

type Rep (Input a) Source # 
Instance details

Defined in Web.Page.Html.Input

data InputType Source #

Various types of web page inputs, encapsulating practical bootstrap class functionality

Instances
Eq InputType Source # 
Instance details

Defined in Web.Page.Html.Input

Show InputType Source # 
Instance details

Defined in Web.Page.Html.Input

Generic InputType Source # 
Instance details

Defined in Web.Page.Html.Input

Associated Types

type Rep InputType :: Type -> Type #

type Rep InputType Source # 
Instance details

Defined in Web.Page.Html.Input

type Rep InputType = D1 (MetaData "InputType" "Web.Page.Html.Input" "web-rep-0.4.0-1tSvqwxGHX6oFAw2f4hvL" False) (((C1 (MetaCons "Slider" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Attribute])) :+: C1 (MetaCons "TextBox" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TextArea" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) :+: (C1 (MetaCons "ColorPicker" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ChooseFile" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "Dropdown" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Text])) :+: (C1 (MetaCons "DropdownSum" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Text])) :+: C1 (MetaCons "Datalist" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Text]) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))) :+: (C1 (MetaCons "Checkbox" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)) :+: (C1 (MetaCons "Toggle" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) :+: C1 (MetaCons "Button" PrefixI False) (U1 :: Type -> Type)))))