yesod-form-0.3.1: Form handling support for Yesod Web Framework

Yesod.Form.Types

Contents

Synopsis

Helpers

data Enctype Source

The encoding type required by a form. The ToHtml instance produces values that can be inserted directly into HTML.

Constructors

UrlEncoded 
Multipart 

data FormResult a Source

A form can produce three different results: there was no data available, the data was invalid, or there was a successful parse.

The Applicative instance will concatenate the failure messages in two FormResults.

data Ints Source

Constructors

IntCons Int Ints 
IntSingle Int 

Instances

Form

type Form sub master a = RWST (Maybe (Env, FileEnv), master, [Lang]) Enctype Ints (GGHandler sub master IO) aSource

newtype AForm sub master a Source

Constructors

AForm 

Fields

unAForm :: (master, [Text]) -> Maybe (Env, FileEnv) -> Ints -> GGHandler sub master IO (FormResult a, [FieldView sub master] -> [FieldView sub master], Ints, Enctype)
 

Instances

Functor (AForm sub master) 
Applicative (AForm sub master) 
Monoid a => Monoid (AForm sub master a) 

Build forms

data Field sub master a Source

Constructors

Field 

Fields

fieldParse :: [Text] -> GGHandler sub master IO (Either (SomeMessage master) (Maybe a))
 
fieldView :: Text -> Text -> Either Text a -> Bool -> GWidget sub master ()

ID, name, (invalid text OR legimiate result), required?

data FieldSettings msg Source

Constructors

FieldSettings 

Fields

fsLabel :: msg
 
fsTooltip :: Maybe msg
 
fsId :: Maybe Text
 
fsName :: Maybe Text
 

Instances

data FieldView sub master Source

Constructors

FieldView 

Fields

fvLabel :: Html
 
fvTooltip :: Maybe Html
 
fvId :: Text
 
fvInput :: GWidget sub master ()
 
fvErrors :: Maybe Html
 
fvRequired :: Bool