Formless
Formless is a renderless component to help you build forms in Halogen. This module re-exports all public functions and types from the library, and can be used as the single import for most use cases.
import Formless as F
Re-exports from Formless.Action
#validateAll
validateAll :: forall v. Variant (validateAll :: Unit | v)
Validate all fields in the form, collecting errors
[ HE.onClick \_ -> Just F.validateAll ]
#validate
#submit
#setValidateAll
setValidateAll :: forall form v is' is. Newtype (form Record InputField) (Record is') => HMap WrapField (Record is) (Record is') => Record is -> Variant (setAll :: Tuple (form Record InputField) Boolean | v)
Provide a record of inputs to overwrite all current inputs without
resetting the form (as loadForm
does), and then validate the
entire new set of fields. Similar to calling setValidate
on every
field in the form.
[ HE.onClick \_ -> Just $ F.setValidateAll
{ name: "Default Name"
, enabled: false
}
]
#setValidate
setValidate :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Proxy sym -> i -> Variant (modifyValidate :: Tuple (Maybe Milliseconds) (form Variant InputFunction) | v)
Set the input value of a form field at the specified label, also triggering validation to run on the field.
[ HE.onValueInput $ Just <<< F.setValidate _name ]
#setAll
setAll :: forall form v is is'. Newtype (form Record InputField) (Record is') => HMap WrapField (Record is) (Record is') => Record is -> Variant (setAll :: Tuple (form Record InputField) Boolean | v)
Provide a record of input fields to overwrite all current
inputs. Unlike loadForm
, this does not otherwise reset
the form as if it were new. Similar to calling set
on every
field in the form. Does not run validation.
[ HE.onClick \_ -> Just $ F.setAll
{ name: "Default Name"
, enabled: false
}
]
#set
set :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Proxy sym -> i -> Variant (modify :: form Variant InputFunction | v)
Set the input value of a form field at the specified label.
[ HE.onValueInput $ Just <<< F.set _name ]
#resetAll
#reset
reset :: forall form v sym inputs r e i o. IsSymbol sym => Initial i => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Proxy sym -> Variant (reset :: form Variant InputFunction | v)
Reset the value of the specified form field to its default value
according to the Initial
type class.
[ HE.onClick \_ -> Just $ F.reset _name ]
#modifyValidateAll
modifyValidateAll :: forall form v ifs' ifs. Newtype (form Record InputFunction) (Record ifs') => HMap WrapField (Record ifs) (Record ifs') => Record ifs -> Variant (modifyAll :: Tuple (form Record InputFunction) Boolean | v)
Provide a record of input functions to modify all current
inputs, and then validate all fields. Similar to calling
modifyValidate
on every field in the form.
[ HE.onClick \_ -> Just $ F.modifyValidateAll
{ name: \str -> "User: " <> str
, enabled: \bool -> not bool
}
]
#modifyValidate
modifyValidate :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Proxy sym -> (i -> i) -> Variant (modifyValidate :: Tuple (Maybe Milliseconds) (form Variant InputFunction) | v)
Modify the input value of a form field at the specified label, also triggering validation to run on the field, with the provided function.
[ HE.onChange \_ -> Just $ F.modifyValidate _enabled not ]
#modifyAll
modifyAll :: forall form v ifs' ifs. Newtype (form Record InputFunction) (Record ifs') => HMap WrapField (Record ifs) (Record ifs') => Record ifs -> Variant (modifyAll :: Tuple (form Record InputFunction) Boolean | v)
Provide a record of input functions to modify all current
inputs. Similar to calling modify
on every field in the form.
Does not run validation.
[ HE.onClick \_ -> Just $ F.modifyAll
{ name: \str -> "User: " <> str
, enabled: \bool -> not bool
}
]
#modify
modify :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Proxy sym -> (i -> i) -> Variant (modify :: form Variant InputFunction | v)
Modify the input value of a form field at the specified label with the provided function.
[ HE.onChange \_ -> Just $ F.modify _enabled not ]
#loadForm
loadForm :: forall form v. form Record InputField -> Variant (loadForm :: form Record InputField | v)
Load a form from a set of existing inputs. Useful for when you need to mount Formless, perform some other actions like request data from the server, and then load an existing set of inputs.
[ HE.onClick \_ -> Just $ F.loadForm $ F.wrapInputFields
{ name: ""
, enabled: false
}
]
#injAction
#asyncSetValidate
asyncSetValidate :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Milliseconds -> Proxy sym -> i -> Variant (modifyValidate :: Tuple (Maybe Milliseconds) (form Variant InputFunction) | v)
Set the input value of a form field at the specified label, while debouncing validation so that it only runs after the specified amount of time has elapsed since the last modification. Useful when you need to avoid expensive validation but do not want to wait for a blur event to validate.
[ HE.onValueInput $ Just <<< F.asncSetValidate (Milliseconds 300.0) _name ]
#asyncModifyValidate
asyncModifyValidate :: forall form v sym inputs r e i o. IsSymbol sym => Newtype (form Variant InputFunction) (Variant inputs) => Cons sym (InputFunction e i o) r inputs => Milliseconds -> Proxy sym -> (i -> i) -> Variant (modifyValidate :: Tuple (Maybe Milliseconds) (form Variant InputFunction) | v)
Modify the input value of a form field at the specified label, while debouncing validation so that it only runs after the specified amount of time has elapsed since the last modification. Useful when you need to avoid expensive validation but do not want to wait for a blur event to validate.
[ HE.onChange \_ -> Just $ F.asncModifyValidate (Milliseconds 300.0) _enabled not ]
Re-exports from Formless.Class.Initial
#Initial
class Initial v where
A type class that provides initial values for form fields. While superficially similar to
Haskell's Default
type class, this class is only meant for the purposes of defining
initial form values. If you need a default value for a field in your form, you are better
off defining it as a Maybe
field and providing a default as part of validation.
In general, if you find yourself reaching for this type class without defining your form as a row and generating your form spec from it, then you are probably not doing what you intend.
Members
initial :: v
Instances
Initial Unit
Initial Boolean
Initial Int
Initial Number
Initial String
Initial Ordering
Initial (Maybe a)
Initial (Array a)
Initial (List a)
(Ord k) => Initial (Map k v)
(Ord a) => Initial (Set a)
(Monoid b) => Initial (a -> b)
(Initial a, Initial b) => Initial (Tuple a b)
(RowToList row list, MonoidRecord list row row) => Initial (Record row)
Re-exports from Formless.Component
#raiseResult
raiseResult :: forall form st act slots wrappedOutput output m. Newtype (form Record OutputField) (Record wrappedOutput) => HMap UnwrapField (Record wrappedOutput) (Record output) => Event form st -> HalogenM form st act slots (Record output) m Unit
A convenience function for raising a form's validated and unwrapped outputs as its only message to a parent component. Useful when you only want to be notified with a form's successfully-parsed data. For example:
type User = { name :: String, email :: Email }
newtype UserForm r f = UserForm (r
( name :: f Void String String
, email :: f EmailError String Email
))
derive instance newtypeUserForm :: Newtype (UserForm r f) _
-- we only want to handle our `User` type on successful submission; we can
-- use `raiseResult` as our `handleEvent` function to do this conveniently.
formSpec = F.defaultSpec { handleEvent = raiseResult }
-- the parent can now just handle the `User` output
data ParentAction = HandleForm User
type ChildSlots = ( formless :: F.Slot' UserForm User Unit )
#handleQuery
handleQuery :: forall form st query act slots msg m a is ixs ivs fs fxs us vs os ifs ivfs. MonadAff m => RowToList is ixs => RowToList fs fxs => EqRecord ixs is => InputFieldsToFormFields ixs is fs => FormFieldsToInputFields fxs fs is => CountErrors fxs fs => AllTouched fxs fs => SetFormFieldsTouched fxs fs fs => ReplaceFormFieldInputs is fxs fs fs => ModifyAll ifs fxs fs fs => ValidateAll vs fxs fs fs m => FormFieldToMaybeOutput fxs fs os => Newtype (form Record InputField) (Record is) => Newtype (form Record InputFunction) (Record ifs) => Newtype (form Record FormField) (Record fs) => Newtype (form Record OutputField) (Record os) => Newtype (form Record (Validation form m)) (Record vs) => Newtype (form Variant InputField) (Variant ivs) => Newtype (form Variant InputFunction) (Variant ivfs) => Newtype (form Variant U) (Variant us) => Lacks "internal" st => (forall b. query b -> HalogenM form st act slots msg m (Maybe b)) -> (Event form st -> HalogenM form st act slots msg m Unit) -> Query form query slots a -> HalogenM form st act slots msg m (Maybe a)
#handleAction
handleAction :: forall form st act slots msg m is ixs ivs fs fxs us vs os ifs ivfs. MonadAff m => RowToList is ixs => RowToList fs fxs => EqRecord ixs is => InputFieldsToFormFields ixs is fs => FormFieldsToInputFields fxs fs is => CountErrors fxs fs => AllTouched fxs fs => SetFormFieldsTouched fxs fs fs => ReplaceFormFieldInputs is fxs fs fs => ModifyAll ifs fxs fs fs => ValidateAll vs fxs fs fs m => FormFieldToMaybeOutput fxs fs os => Newtype (form Record InputField) (Record is) => Newtype (form Record InputFunction) (Record ifs) => Newtype (form Record FormField) (Record fs) => Newtype (form Record OutputField) (Record os) => Newtype (form Record (Validation form m)) (Record vs) => Newtype (form Variant InputField) (Variant ivs) => Newtype (form Variant InputFunction) (Variant ivfs) => Newtype (form Variant U) (Variant us) => Lacks "internal" st => (act -> HalogenM form st act slots msg m Unit) -> (Event form st -> HalogenM form st act slots msg m Unit) -> Action form act -> HalogenM form st act slots msg m Unit
#defaultSpec
defaultSpec :: forall form st query act slots input msg m. Spec form st query act slots input msg m
The default spec, which can be overridden by whatever functions you need to extend the component. For example:
mySpec = F.defaultSpec { render = myRender }
#component
component :: forall form st query act slots input msg m is ixs ivs fs fxs us vs os ifs ivfs. MonadAff m => RowToList is ixs => RowToList fs fxs => EqRecord ixs is => InputFieldsToFormFields ixs is fs => FormFieldsToInputFields fxs fs is => CountErrors fxs fs => AllTouched fxs fs => SetFormFieldsTouched fxs fs fs => ReplaceFormFieldInputs is fxs fs fs => ModifyAll ifs fxs fs fs => ValidateAll vs fxs fs fs m => FormFieldToMaybeOutput fxs fs os => MakeInputFieldsFromRow ixs is is => Newtype (form Record InputField) (Record is) => Newtype (form Record InputFunction) (Record ifs) => Newtype (form Record FormField) (Record fs) => Newtype (form Record OutputField) (Record os) => Newtype (form Record (Validation form m)) (Record vs) => Newtype (form Variant InputField) (Variant ivs) => Newtype (form Variant InputFunction) (Variant ivfs) => Newtype (form Variant U) (Variant us) => Lacks "validators" st => Lacks "initialInputs" st => Lacks "validity" st => Lacks "dirty" st => Lacks "errors" st => Lacks "submitAttempts" st => Lacks "submitting" st => Lacks "form" st => Lacks "internal" st => (input -> Input form st m) -> Spec form st query act slots input msg m -> Component form query slots input msg m
The Formless component, which takes a spec
and provides a running form
component from it.
Re-exports from Formless.Data.FormFieldResult
#FormFieldResult
data FormFieldResult error output
A data type which represents the possible output states of the field. Use
the helpers in Retrieve
to easily manipulate this type.
Constructors
NotValidated
Validating
Error error
Success output
Instances
(Eq e, Eq o) => Eq (FormFieldResult e o)
Functor (FormFieldResult e)
Apply (FormFieldResult e)
Applicative (FormFieldResult e)
Bind (FormFieldResult e)
Monad (FormFieldResult e)
#toMaybe
toMaybe :: forall e o. FormFieldResult e o -> Maybe o
#fromEither
fromEither :: forall e o. Either e o -> FormFieldResult e o
#_Success
_Success :: forall e o. Prism' (FormFieldResult e o) o
#_Error
_Error :: forall e o. Prism' (FormFieldResult e o) e
Re-exports from Formless.Query
#submitReply
submitReply :: forall form query ps a. (Maybe (form Record OutputField) -> a) -> Query form query ps a
Submit the form, returning the output of validation if successful
and Nothing
otherwise.
#sendQuery
sendQuery :: forall outS outL inS inL form msg q ps cq cm pps r0 r1 st pmsg act m a. IsSymbol outL => IsSymbol inL => Cons outL (Slot (Query form q ps) msg outS) r0 pps => Cons inL (Slot cq cm inS) r1 ps => Ord outS => Ord inS => Proxy outL -> outS -> Proxy inL -> inS -> cq a -> HalogenM st act pps pmsg m (Maybe a)
When you have specified a child component within Formless and need to query it, you can do so in two ways.
First, you can use H.query
as usual within the handleExtraQuery
function
you provide to Formless as input. You can, for example, write your own query
which manages the child component, write it into the render function you
supply Formless, and then when that query is triggered, query the child
component.
Second, you can use the sendQuery
function within your parent component's
handleAction
or handleQuery
functions. Given the slot for Formless, the
slot for the child component within Formless, and the query you'd like to
send the child component, sendQuery
will run through Formless and return
the query result to the parent.
For example, this is how you would query a dropdown component being run within a Formless form from the parent component.
-- in the parent component which mounts Formless
handleAction = case _ of
SendDropdown (dropdownQuery -> do
result <- F.sendQuery _formless unit _dropdown 10 dropdownQuery
#injQuery
#asQuery
asQuery :: forall form q ps. Variant (PublicAction form) -> Query form q ps Unit
Convert a Formless public action to an action-style query. Any action from Formless.Action will work, but no others.
Re-exports from Formless.Retrieve
#GetTouchedField
data GetTouchedField
Data constructor for the getTouchedField function
Constructors
Instances
Mapping GetTouchedField (FormField e i o) Boolean
#GetResultField
data GetResultField
Data constructor for the getResultField function
Constructors
Instances
Mapping GetResultField (FormField e i o) (FormFieldResult e o)
Heterogeneous type class for the getResultField function
#GetOutput
#GetInputField
data GetInputField
Data constructor for the getInputField function
Constructors
Instances
Mapping GetInputField (FormField e i o) i
Heterogeneous type class for the getInputField function
#GetError
#GetAll
#FormFieldLens
#FormFieldGet
type FormFieldGet e i o x = forall sym form fields t0. IsSymbol sym => Newtype (form Record FormField) (Record fields) => Cons sym (FormField e i o) t0 fields => Proxy sym -> form Record FormField -> x
A type representing a function to produce a value from a record of
form fields given a particular symbol. The result of view
from
Data.Lens applied with a particular lens to the form.
#getTouchedAll
getTouchedAll :: GetAll GetTouchedField
Get the form as a record where all fields are only the touched value
#getTouched
getTouched :: forall e i o. FormFieldGet e i o Boolean
Given a form, get the touched field at the specified symbol
#getResultAll
getResultAll :: GetAll GetResultField
Get the form as a record where all fields are only the result value
#getResult
getResult :: forall e i o. FormFieldGet e i o (FormFieldResult e o)
Given a form, get the result at the specified symbol
#getOutputAll
getOutputAll :: GetAll GetOutput
Get the form as a record where all fields are only the output value
#getOutput
getOutput :: forall e i o. FormFieldGet e i o (Maybe o)
Given a form, get the output (if it exists) at the specified symbol
#getInputAll
getInputAll :: GetAll GetInputField
Get the form as a record where all fields are only the input value
#getInput
getInput :: forall e i o. FormFieldGet e i o i
Given a form, get the input at the specified symbol
#getField
getField :: forall e i o. FormFieldGet e i o (Record (FormFieldRow e i o))
Given a form, get the field at the specified symbol
#getErrorAll
getErrorAll :: GetAll GetError
Get the form as a record where all fields are only the error value
#getError
getError :: forall e i o. FormFieldGet e i o (Maybe e)
Given a form, get the error (if it exists) at the specified symbol
#_FieldTouched
_FieldTouched :: forall e i o. FormFieldLens e i o Boolean
A lens to operate on the 'touched' field at a given symbol in your form
#_FieldResult
_FieldResult :: forall e i o. FormFieldLens e i o (FormFieldResult e o)
A lens to operate on the 'result' field at a given symbol in your form
#_FieldOutput
_FieldOutput :: forall sym form fields t0 e i o. IsSymbol sym => Newtype (form Record FormField) (Record fields) => Cons sym (FormField e i o) t0 fields => Proxy sym -> Traversal' (form Record FormField) o
A traversal to operate on the possible output inside the 'result' field at a given symbol in your form
#_FieldInput
_FieldInput :: forall e i o. FormFieldLens e i o i
A lens to operate on the input at a given symbol in your form
#_FieldError
_FieldError :: forall sym form fields t0 e i o. IsSymbol sym => Newtype (form Record FormField) (Record fields) => Cons sym (FormField e i o) t0 fields => Proxy sym -> Traversal' (form Record FormField) e
A traversal to operate on the possible error inside the 'result' field at a given symbol in your form
#_Field
_Field :: forall e i o. FormFieldLens e i o (Record (FormFieldRow e i o))
A lens to operate on the field at a given symbol in your form
Re-exports from Formless.Transform.Record
#WrapField
#UnwrapField
data UnwrapField
Unwrap every newtype in a record filled with newtypes
Constructors
Instances
(Newtype wrapper x) => Mapping UnwrapField wrapper x
#wrapRecord
wrapRecord :: forall r0 r1. HMap WrapField r0 r1 => r0 -> r1
#wrapInputFunctions
wrapInputFunctions :: forall form ifs ifs'. Newtype (form Record InputFunction) (Record ifs') => HMap WrapField (Record ifs) (Record ifs') => Record ifs -> form Record InputFunction
Provided a record, where each field in the record contains
a function from input -> input
, wraps each function in
the InputField type for compatibility with Formless
#wrapInputFields
wrapInputFields :: forall form is is'. Newtype (form Record InputField) (Record is') => HMap WrapField (Record is) (Record is') => Record is -> form Record InputField
Provided a record, where each field in the record contains
a value of type input
, wraps each value in the InputField
type for compatibility with Formless
#unwrapRecord
unwrapRecord :: forall r0 r1. HMap UnwrapField r0 r1 => r0 -> r1
#unwrapOutputFields
unwrapOutputFields :: forall form os os'. Newtype (form Record OutputField) (Record os) => HMap UnwrapField (Record os) (Record os') => form Record OutputField -> Record os'
Provided your form type containing a record of only valid outputs from the result of validation, unwraps the form and every value in the record to provide a record of only the output values.
Re-exports from Formless.Transform.Row
#SProxies
type SProxies form = forall xs row inputs. RowToList inputs xs => Newtype (form Record InputField) (Record inputs) => MakeSProxies xs row => Record row
A type to collect constraints necessary to apply to prove that a record of SProxies is compatible with your form type.
#MakeInputFieldsFromRow
class MakeInputFieldsFromRow (xs :: RowList Type) (row :: Row Type) (to :: Row Type) | xs -> to where
The class that provides the Builder implementation to efficiently transform a row into a proper InputFields by wrapping it in newtypes and supplying initial values
Members
mkInputFieldsFromRowBuilder :: Proxy xs -> Proxy row -> FromScratch to
Instances
MakeInputFieldsFromRow Nil row ()
(IsSymbol name, Initial i, Cons name (InputField e i o) trash row, MakeInputFieldsFromRow tail row from, Row1Cons name (InputField e i o) from to) => MakeInputFieldsFromRow (Cons name (InputField e i o) tail) row to
#MakeSProxies
class MakeSProxies (xs :: RowList Type) (to :: Row Type) | xs -> to where
The class used to build up a new record of symbol proxies from an input row list.
Members
makeSProxiesBuilder :: Proxy xs -> FromScratch to
Instances
MakeSProxies Nil ()
(IsSymbol name, Row1Cons name (Proxy name) from to, MakeSProxies tail from) => MakeSProxies (Cons name x tail) to
#mkSProxies
mkSProxies :: forall form xs inputs row. RowToList inputs xs => Newtype (form Record InputField) (Record inputs) => MakeSProxies xs row => Proxy form -> Record row
A helper function to produce a record of SProxies given a form spec, to save you the boilerplate of writing them all out.
#mkInputFields
mkInputFields :: forall xs form inputs. RowToList inputs xs => Newtype (form Record InputField) (Record inputs) => MakeInputFieldsFromRow xs inputs inputs => form Record InputField
A function to transform a row of labels into a InputFields. This allows you
to go directly from a custom form newtype to an inputs record without having to
fill in any values. Requires that all members have an instance of the
Initial
type class (all monoidal values do by default, along with some
other primitives).
Re-exports from Formless.Types.Component
#ValidStatus
#StateRow
#State'
#State
type State form st m = Record (StateRow form (internal :: InternalState form m | st))
The component local state
#Spec'
#Spec
type Spec form st query act slots input msg m = { finalize :: Maybe act, handleAction :: act -> HalogenM form st act slots msg m Unit, handleEvent :: Event form st -> HalogenM form st act slots msg m Unit, handleQuery :: forall a. query a -> HalogenM form st act slots msg m (Maybe a), initialize :: Maybe act, receive :: input -> Maybe act, render :: PublicState form st -> ComponentHTML form act slots m }
A type representing the various functions that can be provided to extend
the Formless component. Usually only the render
function is required,
but you may also provide others. For example, if you have child components,
you can tell Formless how to manage those child components by adding a
handler action and handleAction
case.
#Slot'
#Slot
#QueryF
data QueryF form slots a
The internals of the public component query type. Many of these are shared
with actions of the same name so they can be used in rendering. See
Formless.Action
and Formless.Query
for more.
Constructors
SubmitReply (Maybe (form Record OutputField) -> a)
SendQuery (ChildQueryBox slots (Maybe a))
AsQuery (Variant (PublicAction form)) a
Instances
#Query'
#Query
#PublicState
type PublicState form st = Record (StateRow form st)
The component's public state
#PublicAction
type PublicAction form = (loadForm :: form Record InputField, modify :: form Variant InputFunction, modifyAll :: Tuple (form Record InputFunction) Boolean, modifyValidate :: Tuple (Maybe Milliseconds) (form Variant InputFunction), reset :: form Variant InputFunction, resetAll :: Unit, setAll :: Tuple (form Record InputField) Boolean, submit :: Unit, validate :: form Variant U, validateAll :: Unit)
#InternalState
newtype InternalState form m
A newtype to make easier type errors for end users to read by hiding internal fields
Constructors
InternalState { allTouched :: Boolean, debounceRef :: Maybe (Ref (Maybe Debouncer)), initialInputs :: form Record InputField, validationRef :: Maybe (Ref (Maybe ForkId)), validators :: form Record (Validation form m) }
Instances
Newtype (InternalState form m) _
#InternalAction
type InternalAction act r = (initialize :: Maybe act, syncFormData :: Unit | r)
#Input'
#Input
type Input form st m = { initialInputs :: Maybe (form Record InputField), validators :: form Record (Validation form m) | st }
The component's input type. If you provide Nothing
as your initialInputs
then the form will fill in values based on the Initial
type class for the
field's input type. Otherwise, the form will contain the values you provide.
Validators can be created using the Formless.Validation module.
#HalogenM'
#HalogenM
#Event
data Event form st
The component tries to require as few messages to be handled as possible. You can always use the *Reply variants of queries to perform actions and receive a result out the other end, or extend these messages.
Constructors
Submitted (form Record OutputField)
Changed (PublicState form st)
#Debouncer
#ComponentHTML'
type ComponentHTML' form m = ComponentHTML form Void () m
A simple component HTML type when the component does not need extension
#ComponentHTML
type ComponentHTML form act slots m = ComponentHTML (Action form act) slots m
The component's HTML type, the result of the render function.
#Component'
type Component' form input m = Component form (Const Void) () input Void m
A simple component type when the component does not need extension
#Component
#Action
type Action form act = Variant (userAction :: act | (InternalAction act) + (PublicAction form))
The component action type. While actions are typically considered
internal to a component, in Formless you write the render function and will
need to be able to use these directly. Many of these are shared with queries
of the same name so they can be used either as queries or as actions. See
Formless.Action
and Formless.Query
.
You can freely extend this type with your own actions using injAction
.
#_formless
Re-exports from Formless.Types.Form
#OutputType
type OutputType error input output = output
#OutputField
newtype OutputField error input output
Constructors
OutputField output
Instances
Newtype (OutputField e i o) _
(Eq o) => Eq (OutputField e i o)
(Show o) => Show (OutputField e i o)
#InputFunction
newtype InputFunction error input output
Constructors
InputFunction (input -> input)
Instances
Newtype (InputFunction e i o) _
#InputField
newtype InputField error input output
Constructors
InputField input
Instances
Newtype (InputField e i o) _
(Eq i) => Eq (InputField e i o)
#FormFieldRow
type FormFieldRow error input output = (input :: input, result :: FormFieldResult error output, touched :: Boolean)
The row used for the FormField newtype and in lens type signatures
#FormField
Re-exports from Formless.Validation
#Validation
newtype Validation form m error input output
A wrapper to represent the validation function on a form field, which can itself take the form state as its first argument. Inspired in some parts by the Validation type from purescript-polyform by @paluh.
Constructors
Validation (form Record FormField -> input -> m (Either error output))
Instances
Newtype (Validation form m e i o) _
(Functor m) => Functor (Validation form m e i)
(Monad m) => Apply (Validation form m e i)
(Monad m) => Applicative (Validation form m e i)
(Monad m) => Alt (Validation form m e i)
(Semigroup (m (Either e o))) => Semigroup (Validation form m e i o)
(Applicative m, Monoid (m (Either e o)), Semigroup (m (Either e o))) => Monoid (Validation form m e i o)
(Monad m) => Semigroupoid (Validation form m e)
(Monad m) => Category (Validation form m e)
(Monad m) => Mapping EmptyValidators a (Validation form m e i i)
The heterogeneous instance the noValidation function
#EmptyValidators
data EmptyValidators
The data type used for the noValidation function's heterogenous instance
Constructors
Instances
(Monad m) => Mapping EmptyValidators a (Validation form m e i i)
The heterogeneous instance the noValidation function
#runValidation
runValidation :: forall form m e i o. Monad m => Validation form m e i o -> form Record FormField -> i -> m (Either e o)
A more verbose but clearer function for running a validation function on its inputs
#noValidators
noValidators :: forall form fields m vs xs. Monad m => RowToList fields xs => Newtype (form Record (Validation form m)) (Record vs) => Newtype (form Record InputField) (Record fields) => MapRecordWithIndex xs (ConstMapping EmptyValidators) fields vs => form Record InputField -> form Record (Validation form m)
A function to create a record of validators that simply pass through all inputs
for when no validation is needed. Provide this as your validators
function.
#noValidation
noValidation :: forall form m e i. Monad m => Validation form m e i i
A validation function which simply passes through its input value as its output value. Use on individual fields which do not need any validation.
#hoistFn_
hoistFn_ :: forall form m e i o. Monad m => (i -> o) -> Validation form m e i o
Turn a function from (i -> o) into a proper Validation
#hoistFnME_
hoistFnME_ :: forall form m e i o. Monad m => (i -> m (Either e o)) -> Validation form m e i o
Turn a function from (i -> m (Either e o)) into a proper Validation
#hoistFnME
#hoistFnE_
hoistFnE_ :: forall form m e i o. Monad m => (i -> Either e o) -> Validation form m e i o
Turn a function from (i -> Either e o) into a proper Validation
#hoistFnE
Modules
- AWS.CloudWatch
- AWS.CloudWatchLogs
- AWS.Core.Client
- AWS.Core.Credentials
- AWS.Core.Types
- AWS.Core.Util
- AWS.CostExplorer
- AWS.CostExplorer.Types
- AWS.Crypto.Crypto
- AWS.DynamoDb
- AWS.EC2
- AWS.KMS
- AWS.Lambda
- AWS.S3
- AWS.SecretsManager
- AWS.SecurityTokenService
- Ace
- Ace.Anchor
- Ace.BackgroundTokenizer
- Ace.Command
- Ace.Config
- Ace.Document
- Ace.EditSession
- Ace.Editor
- Ace.Ext.LanguageTools
- Ace.Ext.LanguageTools.Completer
- Ace.KeyBinding
- Ace.Marker
- Ace.Range
- Ace.ScrollBar
- Ace.Search
- Ace.Selection
- Ace.TokenIterator
- Ace.Tokenizer
- Ace.Types
- Ace.UndoManager
- Ace.VirtualRenderer
- Affjax
- Affjax.RequestBody
- Affjax.RequestHeader
- Affjax.ResponseFormat
- Affjax.ResponseHeader
- Affjax.StatusCode
- Ansi.Codes
- Ansi.Output
- Audio.SoundFont
- Audio.SoundFont.Decoder
- Audio.SoundFont.Gleitz
- Audio.SoundFont.Melody
- Audio.SoundFont.Melody.Class
- Audio.SoundFont.Melody.Maker
- Biscotti.Cookie
- Biscotti.Cookie.Formatter
- Biscotti.Cookie.Generator
- Biscotti.Cookie.Parser
- Biscotti.Cookie.Types
- Biscotti.Session
- Biscotti.Session.Store
- Biscotti.Session.Store.Cookie
- Biscotti.Session.Store.Memory
- Bucketchain
- Bucketchain.BasicAuth
- Bucketchain.CORS
- Bucketchain.CSRF
- Bucketchain.Conditional
- Bucketchain.Header.Cookie
- Bucketchain.Header.Vary
- Bucketchain.Health
- Bucketchain.HistoryAPIFallback
- Bucketchain.Http
- Bucketchain.Logger.Error
- Bucketchain.Logger.HTTP.LTSV
- Bucketchain.Logger.HTTP.Token
- Bucketchain.Logger.HTTP.Tokenizer
- Bucketchain.Middleware
- Bucketchain.ResponseBody
- Bucketchain.SSLify
- Bucketchain.Secure
- Bucketchain.Secure.ContentTypeOptions
- Bucketchain.Secure.DownloadOptions
- Bucketchain.Secure.FrameOptions
- Bucketchain.Secure.HSTS
- Bucketchain.Secure.XSSProtection
- Bucketchain.SimpleAPI
- Bucketchain.SimpleAPI.Auth
- Bucketchain.SimpleAPI.Auth.Class
- Bucketchain.SimpleAPI.Batch
- Bucketchain.SimpleAPI.Body
- Bucketchain.SimpleAPI.Class
- Bucketchain.SimpleAPI.FreeT.Class
- Bucketchain.SimpleAPI.JSON
- Bucketchain.SimpleAPI.Proc
- Bucketchain.SimpleAPI.RawData
- Bucketchain.SimpleAPI.Response
- Bucketchain.SimpleAPI.Response.Class
- Bucketchain.Static
- Bucketchain.Static.ContentType
- Bucketchain.Stream
- Bucketchain.Test
- CSS
- CSS.Animation
- CSS.Background
- CSS.Border
- CSS.Box
- CSS.Color
- CSS.Common
- CSS.Cursor
- CSS.Display
- CSS.Elements
- CSS.Flexbox
- CSS.Font
- CSS.FontFace
- CSS.FontStyle
- CSS.Geometry
- CSS.Gradient
- CSS.ListStyle
- CSS.ListStyle.Image
- CSS.ListStyle.Position
- CSS.ListStyle.Type
- CSS.Media
- CSS.Overflow
- CSS.Property
- CSS.Pseudo
- CSS.Render
- CSS.Selector
- CSS.Size
- CSS.String
- CSS.Stylesheet
- CSS.Text
- CSS.Text.Overflow
- CSS.Text.Shadow
- CSS.Text.Transform
- CSS.Text.Whitespace
- CSS.TextAlign
- CSS.Time
- CSS.Transform
- CSS.Transition
- CSS.VerticalAlign
- CSSOM.Main
- CallByName.Alt
- CallByName.Applicative
- CallByName.Class
- CallByName.Monoid
- CallByName.Syntax
- Cheerio
- Cheerio.Static
- Cirru.Node
- Cirru.Parser
- Cirru.Writer
- Clipboardy
- Codensity
- Color
- Color.Blending
- Color.Scale
- Color.Scale.Perceptual
- Color.Scheme.Clrs
- Color.Scheme.HTML
- Color.Scheme.Harmonic
- Color.Scheme.MaterialDesign
- Color.Scheme.X11
- Concur.Core
- Concur.Core.DOM
- Concur.Core.DevTools
- Concur.Core.Discharge
- Concur.Core.ElementBuilder
- Concur.Core.FRP
- Concur.Core.Gen
- Concur.Core.IsWidget
- Concur.Core.LiftWidget
- Concur.Core.Patterns
- Concur.Core.Props
- Concur.Core.Types
- Concur.React
- Concur.React.DOM
- Concur.React.Props
- Concur.React.Run
- Concur.React.SVG
- Concur.React.Widgets
- Concurrent.BoundedQueue
- Concurrent.BoundedQueue.Internal
- Concurrent.BoundedQueue.Sync
- Concurrent.Channel
- Concurrent.Channel.Stream
- Concurrent.Queue
- Control.Alt
- Control.Alternative
- Control.Applicative
- Control.Applicative.Free
- Control.Applicative.Free.Gen
- Control.Applicative.Indexed
- Control.Apply
- Control.Apply.Indexed
- Control.Biapplicative
- Control.Biapply
- Control.Bind
- Control.Bind.Indexed
- Control.Category
- Control.Category.Tensor
- Control.Cofree
- Control.Comonad
- Control.Comonad.Cofree
- Control.Comonad.Cofree.Class
- Control.Comonad.Cofree.Trans
- Control.Comonad.Env
- Control.Comonad.Env.Class
- Control.Comonad.Env.Trans
- Control.Comonad.Store
- Control.Comonad.Store.Class
- Control.Comonad.Store.Trans
- Control.Comonad.Traced
- Control.Comonad.Traced.Class
- Control.Comonad.Traced.Trans
- Control.Comonad.Trans.Class
- Control.Coroutine
- Control.Coroutine.Aff
- Control.Error.Util
- Control.Execution.Immediate
- Control.Extend
- Control.Fold
- Control.Lazy
- Control.Logger
- Control.Logger.Console
- Control.Logger.Writer
- Control.Monad
- Control.Monad.Base
- Control.Monad.Cont
- Control.Monad.Cont.Class
- Control.Monad.Cont.Trans
- Control.Monad.Error.Class
- Control.Monad.Except
- Control.Monad.Except.Checked
- Control.Monad.Except.Trans
- Control.Monad.Fork.Class
- Control.Monad.Free
- Control.Monad.Free.Class
- Control.Monad.Free.Trans
- Control.Monad.Gen
- Control.Monad.Gen.Class
- Control.Monad.Gen.Common
- Control.Monad.Identity.Trans
- Control.Monad.Indexed
- Control.Monad.Indexed.Qualified
- Control.Monad.List.Trans
- Control.Monad.Logger.Class
- Control.Monad.Logger.Trans
- Control.Monad.Loops
- Control.Monad.Maybe.Trans
- Control.Monad.Morph
- Control.Monad.RWS
- Control.Monad.RWS.Trans
- Control.Monad.Reader
- Control.Monad.Reader.Class
- Control.Monad.Reader.Trans
- Control.Monad.Rec.Class
- Control.Monad.Rec.Loops
- Control.Monad.Resource
- Control.Monad.Resource.Aff.Pool
- Control.Monad.Resource.Class
- Control.Monad.Resource.Internal.Registry
- Control.Monad.Resource.Trans
- Control.Monad.ST
- Control.Monad.ST.Class
- Control.Monad.ST.Global
- Control.Monad.ST.Internal
- Control.Monad.ST.Ref
- Control.Monad.State
- Control.Monad.State.Class
- Control.Monad.State.Trans
- Control.Monad.Trampoline
- Control.Monad.Trans.Class
- Control.Monad.Trans.Control
- Control.Monad.Trans.Unlift
- Control.Monad.VexceptT
- Control.Monad.Writer
- Control.Monad.Writer.Class
- Control.Monad.Writer.Trans
- Control.MonadFix
- Control.MonadPlus
- Control.MonadZero
- Control.MultiAlternative
- Control.Parallel
- Control.Parallel.Class
- Control.Plus
- Control.Promise
- Control.Safely
- Control.Semigroupoid
- Control.ShiftMap
- Control.Subcategory.Adjoint
- Control.Subcategory.Category
- Control.Subcategory.Closed
- Control.Subcategory.ClosedMonoidal
- Control.Subcategory.ClosedSemimonoidal
- Control.Subcategory.Constituency
- Control.Subcategory.Endofunctor
- Control.Subcategory.Endofunctor.Applicative
- Control.Subcategory.Endofunctor.Apply
- Control.Subcategory.Endofunctor.Bind
- Control.Subcategory.Endofunctor.Discard
- Control.Subcategory.Endofunctor.HasApply
- Control.Subcategory.Endofunctor.HasBind
- Control.Subcategory.Endofunctor.HasCompose
- Control.Subcategory.Endofunctor.HasConst
- Control.Subcategory.Endofunctor.HasMap
- Control.Subcategory.Endofunctor.HasPoint
- Control.Subcategory.Endofunctor.HasPure
- Control.Subcategory.Endofunctor.HasUnpoint
- Control.Subcategory.Endofunctor.Monad
- Control.Subcategory.Endofunctor.Parameterized.HasConst
- Control.Subcategory.Functor
- Control.Subcategory.Functor.Discard
- Control.Subcategory.Functor.HasApply
- Control.Subcategory.Functor.HasBind
- Control.Subcategory.Functor.HasConst
- Control.Subcategory.Functor.HasMap
- Control.Subcategory.Functor.HasPure
- Control.Subcategory.Functor.Parameterized.HasConst
- Control.Subcategory.HasCompose
- Control.Subcategory.HasCurriedEval
- Control.Subcategory.HasCurry
- Control.Subcategory.HasIdentity
- Control.Subcategory.HasIntroduce
- Control.Subcategory.HasStart
- Control.Subcategory.HasTJoin
- Control.Subcategory.HasTUnit
- Control.Subcategory.HasTerminate
- Control.Subcategory.HasUncurriedEval
- Control.Subcategory.HasUncurry
- Control.Subcategory.HasUnit
- Control.Subcategory.Monoidal
- Control.Subcategory.Profunctor
- Control.Subcategory.Profunctor.HasDimap
- Control.Subcategory.Relation.Reflexive
- Control.Subcategory.Relation.Symmetric
- Control.Subcategory.Restrictable
- Control.Subcategory.Semigroupoid
- Control.Subcategory.Semimonoidal
- Control.Subcategory.Slackable
- Control.Subcategory.Strength
- Crypto.Scrypt
- Crypto.Subtle.Constants.AES
- Crypto.Subtle.Constants.EC
- Crypto.Subtle.Constants.RSA
- Crypto.Subtle.Encrypt
- Crypto.Subtle.Hash
- Crypto.Subtle.Key.Derive
- Crypto.Subtle.Key.Generate
- Crypto.Subtle.Key.Import
- Crypto.Subtle.Key.Types
- Crypto.Subtle.Key.Wrap
- Crypto.Subtle.Sign
- DOM.HTML.Indexed
- DOM.HTML.Indexed.ButtonType
- DOM.HTML.Indexed.CrossOriginValue
- DOM.HTML.Indexed.DirValue
- DOM.HTML.Indexed.FormMethod
- DOM.HTML.Indexed.InputAcceptType
- DOM.HTML.Indexed.InputType
- DOM.HTML.Indexed.KindValue
- DOM.HTML.Indexed.MenuType
- DOM.HTML.Indexed.MenuitemType
- DOM.HTML.Indexed.OnOff
- DOM.HTML.Indexed.OrderedListType
- DOM.HTML.Indexed.PreloadValue
- DOM.HTML.Indexed.ScopeValue
- DOM.HTML.Indexed.StepValue
- DOM.HTML.Indexed.WrapValue
- Data.Align
- Data.Argonaut
- Data.Argonaut.Core
- Data.Argonaut.Decode
- Data.Argonaut.Decode.Class
- Data.Argonaut.Decode.Combinators
- Data.Argonaut.Decode.Decoders
- Data.Argonaut.Decode.Error
- Data.Argonaut.Decode.Generic
- Data.Argonaut.Decode.Parser
- Data.Argonaut.Encode
- Data.Argonaut.Encode.Class
- Data.Argonaut.Encode.Combinators
- Data.Argonaut.Encode.Encoders
- Data.Argonaut.Encode.Generic
- Data.Argonaut.Gen
- Data.Argonaut.JCursor
- Data.Argonaut.JCursor.Gen
- Data.Argonaut.Parser
- Data.Argonaut.Prisms
- Data.Argonaut.Traversals
- Data.Argonaut.Types.Generic
- Data.Array
- Data.Array.NonEmpty
- Data.Array.NonEmpty.Internal
- Data.Array.Partial
- Data.Array.ST
- Data.Array.ST.Iterator
- Data.Array.ST.Partial
- Data.ArrayBuffer.BIP39
- Data.ArrayBuffer.Types
- Data.Bifoldable
- Data.Bifunctor
- Data.Bifunctor.ApplicativeDo
- Data.Bifunctor.Join
- Data.Bifunctor.Module
- Data.Bifunctor.Monoidal
- Data.Bifunctor.Monoidal.Specialized
- Data.BigInt
- Data.Binary.Base64
- Data.Bitraversable
- Data.Boolean
- Data.BooleanAlgebra
- Data.Bounded
- Data.Bounded.Generic
- Data.ByteString
- Data.ByteString.Encode
- Data.CatList
- Data.CatQueue
- Data.Char
- Data.Char.Gen
- Data.Char.Utils
- Data.CodePoint.Unicode
- Data.CodePoint.Unicode.Internal
- Data.CodePoint.Unicode.Internal.Casing
- Data.Codec
- Data.Codec.Argonaut
- Data.Codec.Argonaut.Common
- Data.Codec.Argonaut.Compat
- Data.Codec.Argonaut.Generic
- Data.Codec.Argonaut.Migration
- Data.Codec.Argonaut.Record
- Data.Codec.Argonaut.Sum
- Data.Codec.Argonaut.Variant
- Data.CommutativeRing
- Data.Compactable
- Data.Comparison
- Data.Complex
- Data.Const
- Data.Coyoneda
- Data.Date
- Data.Date.Component
- Data.Date.Component.Gen
- Data.Date.Gen
- Data.DateTime
- Data.DateTime.Gen
- Data.DateTime.Instant
- Data.Decidable
- Data.Decide
- Data.Decimal
- Data.Digit
- Data.Distributive
- Data.Divide
- Data.Divisible
- Data.DivisionRing
- Data.Either
- Data.Either.Inject
- Data.Either.Nested
- Data.EitherR
- Data.Enum
- Data.Enum.Gen
- Data.Enum.Generic
- Data.Eq
- Data.Eq.Generic
- Data.Equivalence
- Data.EuclideanRing
- Data.Exists
- Data.Field
- Data.Filterable
- Data.Fixed
- Data.Foldable
- Data.FoldableWithIndex
- Data.Foreign.EasyFFI
- Data.FormURLEncoded
- Data.Formatter.DateTime
- Data.Formatter.Internal
- Data.Formatter.Interval
- Data.Formatter.Number
- Data.Formatter.Parser.Interval
- Data.Formatter.Parser.Number
- Data.Formatter.Parser.Utils
- Data.Function
- Data.Function.Memoize
- Data.Function.Uncurried
- Data.Functor
- Data.Functor.App
- Data.Functor.ApplicativeDo
- Data.Functor.Clown
- Data.Functor.Compose
- Data.Functor.Contravariant
- Data.Functor.Coproduct
- Data.Functor.Coproduct.Inject
- Data.Functor.Coproduct.Nested
- Data.Functor.Costar
- Data.Functor.Flip
- Data.Functor.Indexed
- Data.Functor.Invariant
- Data.Functor.Joker
- Data.Functor.Module
- Data.Functor.Monoidal
- Data.Functor.Mu
- Data.Functor.Nested
- Data.Functor.Nu
- Data.Functor.Pairing
- Data.Functor.Pairing.Co
- Data.Functor.Product
- Data.Functor.Product.Nested
- Data.Functor.Product2
- Data.Functor.Singleton
- Data.Functor.Variant
- Data.FunctorWithIndex
- Data.Fuzzy
- Data.Generic.Rep
- Data.Geometry.Plane
- Data.Graph
- Data.GraphQL.AST
- Data.GraphQL.Parser
- Data.Group
- Data.Group.Action
- Data.Group.Free
- Data.HTTP.Method
- Data.HashMap
- Data.HashSet
- Data.Hashable
- Data.HeytingAlgebra
- Data.HeytingAlgebra.Generic
- Data.Homogeneous
- Data.Homogeneous.Record
- Data.Homogeneous.Variant
- Data.HugeInt
- Data.HugeInt.Gen
- Data.HugeNum
- Data.HugeNum.Gen
- Data.Identity
- Data.Indexed
- Data.Int
- Data.Int.Bits
- Data.Interpolate
- Data.Interval
- Data.Interval.Duration
- Data.Interval.Duration.Iso
- Data.JSDate
- Data.Lazy
- Data.Leibniz
- Data.Lens
- Data.Lens.AffineTraversal
- Data.Lens.At
- Data.Lens.Barlow
- Data.Lens.Barlow.Construction
- Data.Lens.Barlow.Generic
- Data.Lens.Barlow.Helpers
- Data.Lens.Barlow.Parser
- Data.Lens.Barlow.Types
- Data.Lens.Common
- Data.Lens.Fold
- Data.Lens.Fold.Partial
- Data.Lens.Getter
- Data.Lens.Grate
- Data.Lens.Index
- Data.Lens.Indexed
- Data.Lens.Internal.Bazaar
- Data.Lens.Internal.Exchange
- Data.Lens.Internal.Focusing
- Data.Lens.Internal.Forget
- Data.Lens.Internal.Grating
- Data.Lens.Internal.Indexed
- Data.Lens.Internal.Market
- Data.Lens.Internal.Re
- Data.Lens.Internal.Shop
- Data.Lens.Internal.Stall
- Data.Lens.Internal.Tagged
- Data.Lens.Internal.Wander
- Data.Lens.Internal.Zipping
- Data.Lens.Iso
- Data.Lens.Iso.Newtype
- Data.Lens.Lens
- Data.Lens.Lens.Product
- Data.Lens.Lens.Tuple
- Data.Lens.Lens.Unit
- Data.Lens.Lens.Void
- Data.Lens.Prism
- Data.Lens.Prism.Coproduct
- Data.Lens.Prism.Either
- Data.Lens.Prism.Maybe
- Data.Lens.Record
- Data.Lens.Setter
- Data.Lens.Traversal
- Data.Lens.Types
- Data.Lens.Zoom
- Data.List
- Data.List.Internal
- Data.List.Lazy
- Data.List.Lazy.NonEmpty
- Data.List.Lazy.Types
- Data.List.NonEmpty
- Data.List.Partial
- Data.List.Types
- Data.List.ZipList
- Data.Log.Filter
- Data.Log.Formatter.JSON
- Data.Log.Formatter.Pretty
- Data.Log.Level
- Data.Log.Message
- Data.Log.Tag
- Data.Long
- Data.Long.Bits
- Data.Long.FFI
- Data.Long.Internal
- Data.Long.Unsigned
- Data.Machine.Mealy
- Data.Map
- Data.Map.Gen
- Data.Map.Internal
- Data.Matrix
- Data.Matrix.Algorithms
- Data.Matrix.Operations
- Data.Matrix.RegularMatrices
- Data.Matrix.Reps
- Data.Matrix.Transformations
- Data.Maybe
- Data.Maybe.First
- Data.Maybe.Last
- Data.MediaType
- Data.MediaType.Common
- Data.Midi
- Data.Midi.Generate
- Data.Midi.Instrument
- Data.Midi.Parser
- Data.Midi.WebMidi
- Data.Monoid
- Data.Monoid.Additive
- Data.Monoid.Alternate
- Data.Monoid.Conj
- Data.Monoid.Disj
- Data.Monoid.Dual
- Data.Monoid.Endo
- Data.Monoid.Generic
- Data.Monoid.Multiplicative
- Data.Natural
- Data.NaturalTransformation
- Data.Newtype
- Data.NonEmpty
- Data.Nullable
- Data.Number
- Data.Number.Approximate
- Data.Number.Format
- Data.Op
- Data.Options
- Data.Options.Nested
- Data.Options.UntaggedUnion
- Data.Ord
- Data.Ord.Down
- Data.Ord.Generic
- Data.Ord.Max
- Data.Ord.Min
- Data.Ordering
- Data.Pair
- Data.Posix
- Data.Posix.Signal
- Data.PreciseDate.Component
- Data.PreciseDateTime
- Data.PreciseDateTime.Internal
- Data.Predicate
- Data.Profunctor
- Data.Profunctor.Choice
- Data.Profunctor.Closed
- Data.Profunctor.Cochoice
- Data.Profunctor.Costrong
- Data.Profunctor.Join
- Data.Profunctor.Split
- Data.Profunctor.Star
- Data.Profunctor.Strong
- Data.RFC3339String
- Data.RFC3339String.Format
- Data.Ratio
- Data.Rational
- Data.Refined
- Data.Refined.Error
- Data.Refined.Internal
- Data.Refined.Predicate
- Data.Result
- Data.Ring
- Data.Ring.Generic
- Data.Ring.Module
- Data.SelectionFoldable
- Data.SelectionFoldableWithData
- Data.Semigroup
- Data.Semigroup.Commutative
- Data.Semigroup.First
- Data.Semigroup.Foldable
- Data.Semigroup.Generic
- Data.Semigroup.Last
- Data.Semigroup.Traversable
- Data.Semiring
- Data.Semiring.Free
- Data.Semiring.Generic
- Data.Set
- Data.Set.NonEmpty
- Data.Set.Ordered
- Data.Show
- Data.Show.Generic
- Data.Sparse.Matrix
- Data.Sparse.Polynomial
- Data.String
- Data.String.Base64
- Data.String.Base64.Internal
- Data.String.CaseInsensitive
- Data.String.CodePoints
- Data.String.CodeUnits
- Data.String.Common
- Data.String.Extra
- Data.String.Gen
- Data.String.HtmlElements
- Data.String.Inflection
- Data.String.NonEmpty
- Data.String.NonEmpty.CaseInsensitive
- Data.String.NonEmpty.CodePoints
- Data.String.NonEmpty.CodeUnits
- Data.String.NonEmpty.Internal
- Data.String.Normalize
- Data.String.Pattern
- Data.String.Read
- Data.String.Regex
- Data.String.Regex.Flags
- Data.String.Regex.Unsafe
- Data.String.Unicode
- Data.String.Unsafe
- Data.String.Utils
- Data.Symbol
- Data.TacitString
- Data.TextDecoder
- Data.TextDecoding
- Data.TextEncoder
- Data.TextEncoding
- Data.These
- Data.These.Gen
- Data.Time
- Data.Time.Component
- Data.Time.Component.Gen
- Data.Time.Duration
- Data.Time.Duration.Gen
- Data.Time.Gen
- Data.Time.PreciseDuration
- Data.Time.PreciseDuration.Format
- Data.Traversable
- Data.Traversable.Accum
- Data.Traversable.Accum.Internal
- Data.TraversableWithIndex
- Data.Tree
- Data.Tree.Zipper
- Data.Trifunctor.ApplicativeDo
- Data.Trifunctor.Module
- Data.Trifunctor.Monoidal
- Data.Tuple
- Data.Tuple.Nested
- Data.TwoOrMore
- Data.Typelevel.Bool
- Data.Typelevel.Num
- Data.Typelevel.Num.Aliases
- Data.Typelevel.Num.Ops
- Data.Typelevel.Num.Reps
- Data.Typelevel.Num.Sets
- Data.Typelevel.Undefined
- Data.UInt
- Data.UInt.Gen
- Data.UUID
- Data.Undefinable
- Data.Undefined.NoProblem
- Data.Undefined.NoProblem.Closed
- Data.Undefined.NoProblem.Open
- Data.UndefinedOr
- Data.Unfoldable
- Data.Unfoldable1
- Data.Unit
- Data.Validation.Semigroup
- Data.Validation.Semiring
- Data.Variant
- Data.Variant.Internal
- Data.Vec
- Data.Vector.Polymorphic
- Data.Vector.Polymorphic.Class
- Data.Vector.Polymorphic.Types
- Data.VectorField
- Data.Veither
- Data.Version
- Data.Version.Haskell
- Data.Version.Internal
- Data.Void
- Data.Witherable
- Data.YAML.Foreign.Decode
- Data.YAML.Foreign.Encode
- Data.Yoneda
- Data.Zipper.ArrayZipper
- Database.ElasticSearch
- Database.ElasticSearch.Bulk
- Database.ElasticSearch.Client
- Database.ElasticSearch.Common
- Database.ElasticSearch.Create
- Database.ElasticSearch.Delete
- Database.ElasticSearch.Get
- Database.ElasticSearch.Index
- Database.ElasticSearch.Indices.Create
- Database.ElasticSearch.Indices.Delete
- Database.ElasticSearch.Internal
- Database.ElasticSearch.Query
- Database.ElasticSearch.Search
- Database.ElasticSearch.Update
- Database.Postgres
- Database.Postgres.SqlValue
- Database.Postgres.Transaction
- Debug
- Dodo
- Dodo.Ansi
- Dodo.Common
- Dodo.Internal
- Dodo.Internal.Buffer
- Dotenv
- Dotenv.Internal.Apply
- Dotenv.Internal.ChildProcess
- Dotenv.Internal.Environment
- Dotenv.Internal.Parse
- Dotenv.Internal.Resolve
- Dotenv.Internal.Types
- DynamicBuffer
- Effect
- Effect.AVar
- Effect.Aff
- Effect.Aff.AVar
- Effect.Aff.Bus
- Effect.Aff.Class
- Effect.Aff.Compat
- Effect.Aff.Retry
- Effect.Class
- Effect.Class.Console
- Effect.Console
- Effect.Exception
- Effect.Exception.Unsafe
- Effect.Now
- Effect.Promise
- Effect.Promise.Console
- Effect.Promise.Nonstandard
- Effect.Promise.Unsafe
- Effect.Random
- Effect.Ref
- Effect.Timer
- Effect.Uncurried
- Effect.Unsafe
- Elmish
- Elmish.Boot
- Elmish.Component
- Elmish.Dispatch
- Elmish.Foreign
- Elmish.HTML
- Elmish.HTML.Generated
- Elmish.HTML.Internal
- Elmish.HTML.Styled
- Elmish.HTML.Styled.Generated
- Elmish.JsCallback
- Elmish.React
- Elmish.React.DOM
- Elmish.React.Import
- Elmish.Ref
- Elmish.State
- Elmish.Trace
- Enzyme
- Enzyme.Full
- Enzyme.Shallow
- Enzyme.Wrapper
- ExitCodes
- ExpectInferred
- FFI.Foreign.JSON
- FFI.Foreign.Object
- FFI.Foreign.Operators
- FFI.Unsafe.Foreign
- Foreign
- Foreign.Class
- Foreign.Generic
- Foreign.Generic.Class
- Foreign.Generic.EnumEncoding
- Foreign.Generic.Internal
- Foreign.Index
- Foreign.Internal.Stringify
- Foreign.JSON
- Foreign.Keys
- Foreign.NullOrUndefined
- Foreign.Object
- Foreign.Object.Gen
- Foreign.Object.ST
- Foreign.Object.ST.Unsafe
- Foreign.Object.Unsafe
- Formless
- Formless.Action
- Formless.Class.Initial
- Formless.Component
- Formless.Data.FormFieldResult
- Formless.Internal.Component
- Formless.Internal.Debounce
- Formless.Internal.Transform
- Formless.Query
- Formless.Retrieve
- Formless.Transform.Record
- Formless.Transform.Row
- Formless.Types.Component
- Formless.Types.Form
- Formless.Validation
- Framer.Motion
- Framer.Motion.Hook
- Framer.Motion.MotionComponent
- Framer.Motion.Types
- GLMatrix
- GLMatrix.Mat2
- GLMatrix.Mat2.Mix
- GLMatrix.Mat2d
- GLMatrix.Mat2d.Mix
- GLMatrix.Mat3
- GLMatrix.Mat3.Mix
- GLMatrix.Mat4
- GLMatrix.Mat4.Mix
- GLMatrix.Quat
- GLMatrix.Quat.Mix
- GLMatrix.Vec2
- GLMatrix.Vec2.Mix
- GLMatrix.Vec3
- GLMatrix.Vec3.Mix
- GLMatrix.Vec4
- GLMatrix.Vec4.Mix
- GitHub.Actions.Cache
- GitHub.Actions.Core
- GitHub.Actions.Exec
- GitHub.Actions.IO
- GitHub.Actions.ToolCache
- Gomtang.Basic
- Grain
- Grain.Class
- Grain.Class.GProxy
- Grain.Class.KGProxy
- Grain.Class.LProxy
- Grain.Internal.Diff
- Grain.Internal.Element
- Grain.Internal.Emitter
- Grain.Internal.Handler
- Grain.Internal.MArray
- Grain.Internal.MMap
- Grain.Internal.MObject
- Grain.Internal.Prop
- Grain.Internal.PropDiff
- Grain.Internal.Ref
- Grain.Internal.SpecialProp
- Grain.Internal.Store
- Grain.Internal.Styler
- Grain.Internal.Util
- Grain.Markup
- Grain.Markup.Element
- Grain.Markup.Handler
- Grain.Markup.Prop
- Grain.Router
- Grain.Router.Parser
- Grain.TypeRef
- Grain.UI
- Grain.Virtualized
- GraphQL.Client.Alias
- GraphQL.Client.Args
- GraphQL.Client.BaseClients.Affjax
- GraphQL.Client.BaseClients.Apollo
- GraphQL.Client.BaseClients.Apollo.ErrorPolicy
- GraphQL.Client.BaseClients.Apollo.FetchPolicy
- GraphQL.Client.BaseClients.Urql
- GraphQL.Client.CodeGen.GetSymbols
- GraphQL.Client.CodeGen.Js
- GraphQL.Client.CodeGen.Lines
- GraphQL.Client.CodeGen.Query
- GraphQL.Client.CodeGen.Schema
- GraphQL.Client.CodeGen.Template.Enum
- GraphQL.Client.CodeGen.Template.Schema
- GraphQL.Client.CodeGen.Types
- GraphQL.Client.ID
- GraphQL.Client.Query
- GraphQL.Client.QueryReturns
- GraphQL.Client.SafeQueryName
- GraphQL.Client.Subscription
- GraphQL.Client.ToGqlString
- GraphQL.Client.Types
- GraphQL.Client.WatchQuery
- GraphQL.Hasura.ComparisonExp
- GraphQL.Hasura.Decode
- GraphQL.Hasura.Encode
- GraphQLClient
- GraphQLClient.Argument
- GraphQLClient.Cyrb53
- GraphQLClient.GraphQLEnum
- GraphQLClient.HTTP
- GraphQLClient.Implementation
- GraphQLClient.Utils
- GraphQLClient.WriteGraphQL
- GraphQLClient.WriteGraphQLHash
- Graphics.Canvas
- Graphics.Drawing
- Graphics.Drawing.Font
- HTTPure
- HTTPure.Body
- HTTPure.Contrib.Biscotti
- HTTPure.Contrib.Biscotti.Middleware
- HTTPure.Contrib.Biscotti.SessionManager
- HTTPure.Headers
- HTTPure.Lookup
- HTTPure.Method
- HTTPure.Middleware
- HTTPure.Path
- HTTPure.Query
- HTTPure.Request
- HTTPure.Response
- HTTPure.Server
- HTTPure.Status
- HTTPure.Utils
- HTTPure.Version
- Halogen
- Halogen.Aff
- Halogen.Aff.Driver
- Halogen.Aff.Driver.Eval
- Halogen.Aff.Driver.State
- Halogen.Aff.Util
- Halogen.Component
- Halogen.Component.Profunctor
- Halogen.Data.OrdBox
- Halogen.Data.Slot
- Halogen.HTML
- Halogen.HTML.CSS
- Halogen.HTML.Core
- Halogen.HTML.Elements
- Halogen.HTML.Elements.Keyed
- Halogen.HTML.Events
- Halogen.HTML.Properties
- Halogen.HTML.Properties.ARIA
- Halogen.Hooks
- Halogen.Hooks.Component
- Halogen.Hooks.Extra.Actions.Events
- Halogen.Hooks.Extra.Hooks
- Halogen.Hooks.Extra.Hooks.UseDebouncer
- Halogen.Hooks.Extra.Hooks.UseEvent
- Halogen.Hooks.Extra.Hooks.UseGet
- Halogen.Hooks.Extra.Hooks.UseStateFn
- Halogen.Hooks.Extra.Hooks.UseThrottle
- Halogen.Hooks.Hook
- Halogen.Hooks.HookM
- Halogen.Hooks.Internal.Eval
- Halogen.Hooks.Internal.Eval.Types
- Halogen.Hooks.Internal.Types
- Halogen.Hooks.Internal.UseHookF
- Halogen.Hooks.Types
- Halogen.Query
- Halogen.Query.ChildQuery
- Halogen.Query.Event
- Halogen.Query.HalogenM
- Halogen.Query.HalogenQ
- Halogen.Query.Input
- Halogen.Store.Connect
- Halogen.Store.Monad
- Halogen.Store.Select
- Halogen.Storybook
- Halogen.Storybook.Proxy
- Halogen.Subscription
- Halogen.Svg.Attributes
- Halogen.Svg.Core
- Halogen.Svg.Elements
- Halogen.Svg.Indexed
- Halogen.Svg.Util
- Halogen.Themes.Bootstrap4
- Halogen.VDom
- Halogen.VDom.DOM
- Halogen.VDom.DOM.Prop
- Halogen.VDom.Driver
- Halogen.VDom.Machine
- Halogen.VDom.Thunk
- Halogen.VDom.Types
- Halogen.VDom.Util
- Heterogeneous.Extrablatt.Rec
- Heterogeneous.Folding
- Heterogeneous.Mapping
- IOQueues
- Identy.Normalizer
- Identy.ObjectMap
- Identy.Populater
- Identy.Selector
- IxQueue
- IxQueue.IOQueues
- IxZeta
- JS.FileIO
- JSURI
- Justifill
- Justifill.Fillable
- Justifill.Justifiable
- Jwt
- Kafka.Consumer
- Kafka.Kafka
- Kafka.Producer
- Kafka.Transaction
- Kafka.Types
- Language.PS.CST
- Language.PS.CST.Printers
- Language.PS.CST.Printers.PrintImports
- Language.PS.CST.Printers.PrintModuleModuleNameAndExports
- Language.PS.CST.Printers.TypeLevel
- Language.PS.CST.Printers.Utils
- Language.PS.CST.ReservedNames
- Language.PS.CST.Sugar.Declaration
- Language.PS.CST.Sugar.Leafs
- Language.PS.CST.Sugar.QualifiedName
- Language.PS.CST.Types.Declaration
- Language.PS.CST.Types.Leafs
- Language.PS.CST.Types.Module
- Language.PS.CST.Types.QualifiedName
- Language.PS.SmartCST
- Language.PS.SmartCST.ProcessModule
- Language.PS.SmartCST.ProcessSmartDeclaration
- Language.PS.SmartCST.ProcessSmartDeclaration.Utils
- Language.PS.SmartCST.Sugar.Declaration
- Language.PS.SmartCST.Types.Declaration
- Language.PS.SmartCST.Types.SmartQualifiedName
- Language.PS.SmartCST.Types.SmartQualifiedNameConstructor
- Literals
- Literals.Boolean
- Literals.Int
- Literals.Literal
- Literals.Null
- Literals.Number
- Literals.String
- Literals.Undefined
- Logs.Pretty
- Makkori
- Math
- Matrix
- Matryoshka
- Matryoshka.Algebra
- Matryoshka.Class.Corecursive
- Matryoshka.Class.Recursive
- Matryoshka.Coalgebra
- Matryoshka.DistributiveLaw
- Matryoshka.Fold
- Matryoshka.Pattern.CoEnvT
- Matryoshka.Refold
- Matryoshka.Transform
- Matryoshka.Unfold
- Matryoshka.Util
- Milkis
- Milkis.Impl
- Milkis.Impl.Node
- Milkis.Impl.Window
- Morello.Morello
- Morello.Morello.Core
- Morello.Morello.Record
- Morello.Morello.Simple
- Morello.Morello.Validated
- MotionValue
- Motsunabe
- MySQL.Connection
- MySQL.Internal
- MySQL.Pool
- MySQL.QueryValue
- MySQL.Transaction
- Network.EventSource
- Network.RemoteData
- Node.BasicAuth
- Node.Buffer
- Node.Buffer.Class
- Node.Buffer.Immutable
- Node.Buffer.Internal
- Node.Buffer.ST
- Node.Buffer.Types
- Node.ChildProcess
- Node.Crypto
- Node.Crypto.Cipher
- Node.Crypto.Decipher
- Node.Crypto.Hash
- Node.Crypto.Hmac
- Node.Encoding
- Node.Express.App
- Node.Express.Handler
- Node.Express.Middleware.CookieParser
- Node.Express.Middleware.Static
- Node.Express.Request
- Node.Express.Response
- Node.Express.Test.Mock
- Node.Express.Types
- Node.FS
- Node.FS.Aff
- Node.FS.Aff.Mkdirp
- Node.FS.Async
- Node.FS.Internal
- Node.FS.Perms
- Node.FS.Stats
- Node.FS.Stream
- Node.FS.Sync
- Node.Globals
- Node.HTTP
- Node.HTTP.Client
- Node.HTTP.Secure
- Node.Net
- Node.Net.Server
- Node.Net.Socket
- Node.Path
- Node.Platform
- Node.Process
- Node.ReadLine
- Node.Simple.Jwt
- Node.Stream
- Node.Systemd.Journald
- Node.URL
- Node.Which
- Node.Yargs
- Node.Yargs.Applicative
- Node.Yargs.Setup
- NodeMailer
- NodeMailer.Attachment
- NodeMailer.AttachmentStream
- Option
- Options.Applicative
- Options.Applicative.BashCompletion
- Options.Applicative.Builder
- Options.Applicative.Builder.Completer
- Options.Applicative.Builder.Internal
- Options.Applicative.Common
- Options.Applicative.Extra
- Options.Applicative.Help
- Options.Applicative.Help.Chunk
- Options.Applicative.Help.Core
- Options.Applicative.Help.Levenshtein
- Options.Applicative.Help.Pretty
- Options.Applicative.Help.Types
- Options.Applicative.Internal
- Options.Applicative.Internal.Utils
- Options.Applicative.Types
- PSCI.Support
- Partial
- Partial.Unsafe
- Pathy
- Pathy.Gen
- Pathy.Name
- Pathy.Parser
- Pathy.Path
- Pathy.Phantom
- Pathy.Printer
- Pathy.Sandboxed
- Performance.Minibench
- Phoenix
- Pipes
- Pipes.Core
- Pipes.Internal
- Pipes.ListT
- Pipes.Prelude
- PointFree
- Prelude
- Prettier.Printer
- Prim
- Prim.Boolean
- Prim.Coerce
- Prim.Ordering
- Prim.Row
- Prim.RowList
- Prim.Symbol
- Prim.TypeError
- Psa
- Psa.Output
- Psa.Printer
- Psa.Printer.Default
- Psa.Printer.Json
- Psa.Types
- Psa.Util
- PscIde
- PscIde.Command
- PscIde.Project
- PscIde.Server
- PureScript.Metadata
- Queue
- Queue.One
- Queue.Types
- Ran
- Random.LCG
- Rave
- React
- React.Basic
- React.Basic.Classic
- React.Basic.Classic.Components.Async
- React.Basic.DOM
- React.Basic.DOM.Components.GlobalEvents
- React.Basic.DOM.Components.Ref
- React.Basic.DOM.Concurrent
- React.Basic.DOM.Events
- React.Basic.DOM.Generated
- React.Basic.DOM.Internal
- React.Basic.DOM.SVG
- React.Basic.DOM.Server
- React.Basic.Emotion
- React.Basic.Events
- React.Basic.Hooks
- React.Basic.Hooks.Aff
- React.Basic.Hooks.ErrorBoundary
- React.Basic.Hooks.Internal
- React.Basic.Hooks.ResetToken
- React.Basic.Hooks.Suspense
- React.Basic.Hooks.Suspense.Store
- React.Basic.ReactDND
- React.Basic.ReactDND.Backends.HTML5Backend
- React.Basic.ReactDND.Backends.TestBackend
- React.Basic.ReactDND.Backends.TouchBackend
- React.Basic.StrictMode
- React.DOM
- React.DOM.Dynamic
- React.DOM.Props
- React.DOM.SVG
- React.DOM.SVG.Dynamic
- React.Halo
- React.Halo.Component
- React.Halo.Internal.Control
- React.Halo.Internal.Eval
- React.Halo.Internal.State
- React.Halo.Internal.Types
- React.Queue
- React.Queue.LifeCycle
- React.Queue.WhileMounted
- React.Ref
- React.Signal
- React.Signal.LifeCycle
- React.Signal.WhileMounted
- React.SyntheticEvent
- React.TestingLibrary
- ReactDOM
- Record
- Record.Builder
- Record.Extra
- Record.ExtraSrghma
- Record.ExtraSrghma.CompareRecord
- Record.ExtraSrghma.FoldlValues
- Record.ExtraSrghma.FoldlValuesWithIndex
- Record.ExtraSrghma.FoldrValues
- Record.ExtraSrghma.FoldrValuesLazy
- Record.ExtraSrghma.FoldrValuesWithIndex
- Record.ExtraSrghma.Keys
- Record.ExtraSrghma.MapIndex
- Record.ExtraSrghma.MapRecord
- Record.ExtraSrghma.MapValuesWithIndex
- Record.ExtraSrghma.ParSequenceRecord
- Record.ExtraSrghma.SequenceRecord
- Record.ExtraSrghma.ValuesToUnfoldableLazy
- Record.ExtraSrghma.ZipRecord
- Record.Unsafe
- Record.Unsafe.Union
- ReduxDevTools
- Resource
- Resource.Unsafe
- Return
- Return.Folds
- Routing
- Routing.Duplex
- Routing.Duplex.Generic
- Routing.Duplex.Generic.Syntax
- Routing.Duplex.Parser
- Routing.Duplex.Printer
- Routing.Duplex.Types
- Routing.Hash
- Routing.Match
- Routing.Match.Error
- Routing.Parser
- Routing.PushState
- Routing.Types
- Row.Class
- Run
- Run.Choose
- Run.Except
- Run.Internal
- Run.Reader
- Run.State
- Run.Writer
- SQLite3
- SQLite3.Internal
- Safe.Coerce
- Select
- Select.Setters
- Signal
- Signal.Aff
- Signal.Channel
- Signal.DOM
- Signal.Effect
- Signal.Time
- Simple.Ajax
- Simple.Ajax.Errors
- Simple.I18n.Translation
- Simple.I18n.Translator
- Simple.JSON
- Simple.ULID
- SimpleEmitter
- Slug
- Snabbdom
- SodiumFRP.Cell
- SodiumFRP.Class
- SodiumFRP.Lambda
- SodiumFRP.Operational
- SodiumFRP.Stream
- SodiumFRP.Transaction
- Spork.App
- Spork.Batch
- Spork.EventQueue
- Spork.Html
- Spork.Html.Core
- Spork.Html.Elements
- Spork.Html.Elements.Keyed
- Spork.Html.Events
- Spork.Html.Properties
- Spork.Interpreter
- Spork.PureApp
- Spork.Scheduler
- Spork.Transition
- Substitute
- Suggest
- Sunde
- Supply
- Test.Abides.Control.Alt
- Test.Abides.Control.Alternative
- Test.Abides.Control.Applicative
- Test.Abides.Control.Apply
- Test.Abides.Control.Bind
- Test.Abides.Control.Category
- Test.Abides.Control.Comonad
- Test.Abides.Control.Extend
- Test.Abides.Control.Monad
- Test.Abides.Control.MonadPlus
- Test.Abides.Control.MonadZero
- Test.Abides.Control.Plus
- Test.Abides.Control.Semigroupoid
- Test.Abides.Data.BooleaneanAlgebra
- Test.Abides.Data.Bounded
- Test.Abides.Data.BoundedEnum
- Test.Abides.Data.CommutativeRing
- Test.Abides.Data.DivisionRing
- Test.Abides.Data.Eq
- Test.Abides.Data.EuclideanRing
- Test.Abides.Data.Foldable
- Test.Abides.Data.Functor
- Test.Abides.Data.HeytingAlgebra
- Test.Abides.Data.Monoid
- Test.Abides.Data.Ord
- Test.Abides.Data.Ring
- Test.Abides.Data.Semigroup
- Test.Abides.Data.Semiring
- Test.Abides.Properties
- Test.Assert
- Test.QuickCheck
- Test.QuickCheck.Arbitrary
- Test.QuickCheck.Combinators
- Test.QuickCheck.Gen
- Test.QuickCheck.Laws
- Test.QuickCheck.Laws.Control
- Test.QuickCheck.Laws.Control.Align
- Test.QuickCheck.Laws.Control.Alignable
- Test.QuickCheck.Laws.Control.Alt
- Test.QuickCheck.Laws.Control.Alternative
- Test.QuickCheck.Laws.Control.Applicative
- Test.QuickCheck.Laws.Control.Apply
- Test.QuickCheck.Laws.Control.Bind
- Test.QuickCheck.Laws.Control.Category
- Test.QuickCheck.Laws.Control.Comonad
- Test.QuickCheck.Laws.Control.Crosswalk
- Test.QuickCheck.Laws.Control.Extend
- Test.QuickCheck.Laws.Control.Monad
- Test.QuickCheck.Laws.Control.MonadPlus
- Test.QuickCheck.Laws.Control.MonadZero
- Test.QuickCheck.Laws.Control.Plus
- Test.QuickCheck.Laws.Control.Semigroupoid
- Test.QuickCheck.Laws.Data
- Test.QuickCheck.Laws.Data.BooleanAlgebra
- Test.QuickCheck.Laws.Data.Bounded
- Test.QuickCheck.Laws.Data.BoundedEnum
- Test.QuickCheck.Laws.Data.CommutativeRing
- Test.QuickCheck.Laws.Data.DivisionRing
- Test.QuickCheck.Laws.Data.Eq
- Test.QuickCheck.Laws.Data.EuclideanRing
- Test.QuickCheck.Laws.Data.Field
- Test.QuickCheck.Laws.Data.Foldable
- Test.QuickCheck.Laws.Data.Functor
- Test.QuickCheck.Laws.Data.FunctorWithIndex
- Test.QuickCheck.Laws.Data.HeytingAlgebra
- Test.QuickCheck.Laws.Data.Monoid
- Test.QuickCheck.Laws.Data.Ord
- Test.QuickCheck.Laws.Data.Ring
- Test.QuickCheck.Laws.Data.Semigroup
- Test.QuickCheck.Laws.Data.Semiring
- Test.QuickCheck.UTF8String
- Test.Spec
- Test.Spec.Assertions
- Test.Spec.Assertions.DOM
- Test.Spec.Assertions.String
- Test.Spec.Console
- Test.Spec.Discovery
- Test.Spec.Mocha
- Test.Spec.QuickCheck
- Test.Spec.Reporter
- Test.Spec.Reporter.Base
- Test.Spec.Reporter.Console
- Test.Spec.Reporter.Dot
- Test.Spec.Reporter.Spec
- Test.Spec.Reporter.Tap
- Test.Spec.Result
- Test.Spec.Runner
- Test.Spec.Runner.Event
- Test.Spec.Speed
- Test.Spec.Style
- Test.Spec.Summary
- Test.Spec.Tree
- Test.Unit
- Test.Unit.Assert
- Test.Unit.Console
- Test.Unit.Main
- Test.Unit.Output.Fancy
- Test.Unit.Output.Simple
- Test.Unit.Output.TAP
- Test.Unit.QuickCheck
- Text.Email.Parser
- Text.Email.Validate
- Text.Format
- Text.Parsing.Applicative.Repetition
- Text.Parsing.Array.Repetition
- Text.Parsing.Char.Hexadecimal
- Text.Parsing.Combinators.Validation
- Text.Parsing.Expect
- Text.Parsing.Indent
- Text.Parsing.Monoid.Repetition
- Text.Parsing.Parser
- Text.Parsing.Parser.Combinators
- Text.Parsing.Parser.Expect
- Text.Parsing.Parser.Expr
- Text.Parsing.Parser.Language
- Text.Parsing.Parser.Pos
- Text.Parsing.Parser.String
- Text.Parsing.Parser.Token
- Text.Parsing.Replace.String
- Text.Parsing.Replace.String.Combinator
- Text.Parsing.String.Hexadecimal
- Text.Parsing.String.Repetition
- Text.Parsing.String.UUID
- Text.Parsing.StringParser
- Text.Parsing.StringParser.CodePoints
- Text.Parsing.StringParser.CodeUnits
- Text.Parsing.StringParser.Combinators
- Text.Parsing.StringParser.Expr
- Text.Prettier
- Text.PrettyPrint.Leijen
- Thermite
- Thermite.DOM
- Toppokki
- Turf.Helpers
- Type.Data.Boolean
- Type.Data.List
- Type.Data.Ordering
- Type.Data.Peano
- Type.Data.Peano.Int
- Type.Data.Peano.Int.Definition
- Type.Data.Peano.Int.Parse
- Type.Data.Peano.Int.TypeAliases
- Type.Data.Peano.Nat
- Type.Data.Peano.Nat.Definition
- Type.Data.Peano.Nat.Parse
- Type.Data.Peano.Nat.TypeAliases
- Type.Data.Row
- Type.Data.RowList
- Type.Data.Symbol
- Type.Equality
- Type.Function
- Type.Prelude
- Type.Proxy
- Type.Quotient
- Type.Row
- Type.Row.Homogeneous
- Type.RowList
- TypedEnv
- URI
- URI.AbsoluteURI
- URI.Authority
- URI.Common
- URI.Extra.MultiHostPortPair
- URI.Extra.QueryPairs
- URI.Extra.UserPassInfo
- URI.Fragment
- URI.HierarchicalPart
- URI.Host
- URI.Host.Gen
- URI.Host.IPv4Address
- URI.Host.IPv6Address
- URI.Host.RegName
- URI.HostPortPair
- URI.HostPortPair.Gen
- URI.Path
- URI.Path.Absolute
- URI.Path.NoScheme
- URI.Path.Rootless
- URI.Path.Segment
- URI.Port
- URI.Port.Gen
- URI.Query
- URI.RelativePart
- URI.RelativeRef
- URI.Scheme
- URI.Scheme.Common
- URI.URI
- URI.URIRef
- URI.UserInfo
- Undefined
- Unsafe.Coerce
- Unsafe.Reference
- Untagged.Castable
- Untagged.TypeCheck
- Untagged.Union
- UrlRegexSafe
- Web.Bower.PackageMeta
- Web.CSSOM
- Web.CSSOM.CSSStyleDeclaration
- Web.CSSOM.ElementCSSInlineStyle
- Web.CSSOM.Internal.Types
- Web.CSSOM.MouseEvent
- Web.Clipboard.ClipboardEvent
- Web.Clipboard.ClipboardEvent.EventTypes
- Web.DOM
- Web.DOM.CSSStyleSheet
- Web.DOM.CharacterData
- Web.DOM.ChildNode
- Web.DOM.Comment
- Web.DOM.DOMParser
- Web.DOM.DOMTokenList
- Web.DOM.Document
- Web.DOM.Document.XPath
- Web.DOM.Document.XPath.ResultType
- Web.DOM.DocumentFragment
- Web.DOM.DocumentType
- Web.DOM.Element
- Web.DOM.HTMLCollection
- Web.DOM.Internal.Types
- Web.DOM.MutationObserver
- Web.DOM.MutationRecord
- Web.DOM.Node
- Web.DOM.NodeList
- Web.DOM.NodeType
- Web.DOM.NonDocumentTypeChildNode
- Web.DOM.NonElementParentNode
- Web.DOM.ParentNode
- Web.DOM.ProcessingInstruction
- Web.DOM.ShadowRoot
- Web.DOM.StyleSheetList
- Web.DOM.Text
- Web.DOM.XMLSerializer
- Web.DownloadJs
- Web.Encoding.TextDecoder
- Web.Encoding.TextEncoder
- Web.Encoding.UtfLabel
- Web.Event.CustomEvent
- Web.Event.Event
- Web.Event.EventPhase
- Web.Event.EventTarget
- Web.Event.Internal.Types
- Web.Fetch
- Web.Fetch.AbortController
- Web.Fetch.Headers
- Web.Fetch.Integrity
- Web.Fetch.Referrer
- Web.Fetch.ReferrerPolicy
- Web.Fetch.Request
- Web.Fetch.RequestBody
- Web.Fetch.RequestCache
- Web.Fetch.RequestCredentials
- Web.Fetch.RequestMode
- Web.Fetch.RequestRedirect
- Web.Fetch.Response
- Web.File.Blob
- Web.File.File
- Web.File.FileList
- Web.File.FileReader
- Web.File.FileReader.Aff
- Web.File.FileReader.ReadyState
- Web.File.Url
- Web.HTML
- Web.HTML.Common
- Web.HTML.Event.BeforeUnloadEvent
- Web.HTML.Event.BeforeUnloadEvent.EventTypes
- Web.HTML.Event.DataTransfer
- Web.HTML.Event.DragEvent
- Web.HTML.Event.DragEvent.EventTypes
- Web.HTML.Event.ErrorEvent
- Web.HTML.Event.EventTypes
- Web.HTML.Event.HashChangeEvent
- Web.HTML.Event.HashChangeEvent.EventTypes
- Web.HTML.Event.PageTransitionEvent
- Web.HTML.Event.PageTransitionEvent.EventTypes
- Web.HTML.Event.PopStateEvent
- Web.HTML.Event.PopStateEvent.EventTypes
- Web.HTML.Event.TrackEvent
- Web.HTML.Event.TrackEvent.EventTypes
- Web.HTML.HTMLAnchorElement
- Web.HTML.HTMLAreaElement
- Web.HTML.HTMLAudioElement
- Web.HTML.HTMLBRElement
- Web.HTML.HTMLBaseElement
- Web.HTML.HTMLBodyElement
- Web.HTML.HTMLButtonElement
- Web.HTML.HTMLCanvasElement
- Web.HTML.HTMLDListElement
- Web.HTML.HTMLDataElement
- Web.HTML.HTMLDataListElement
- Web.HTML.HTMLDivElement
- Web.HTML.HTMLDocument
- Web.HTML.HTMLDocument.ReadyState
- Web.HTML.HTMLElement
- Web.HTML.HTMLEmbedElement
- Web.HTML.HTMLFieldSetElement
- Web.HTML.HTMLFormElement
- Web.HTML.HTMLHRElement
- Web.HTML.HTMLHeadElement
- Web.HTML.HTMLHeadingElement
- Web.HTML.HTMLHyperlinkElementUtils
- Web.HTML.HTMLIFrameElement
- Web.HTML.HTMLImageElement
- Web.HTML.HTMLImageElement.CORSMode
- Web.HTML.HTMLImageElement.DecodingHint
- Web.HTML.HTMLImageElement.Laziness
- Web.HTML.HTMLInputElement
- Web.HTML.HTMLKeygenElement
- Web.HTML.HTMLLIElement
- Web.HTML.HTMLLabelElement
- Web.HTML.HTMLLegendElement
- Web.HTML.HTMLLinkElement
- Web.HTML.HTMLMapElement
- Web.HTML.HTMLMediaElement
- Web.HTML.HTMLMediaElement.CanPlayType
- Web.HTML.HTMLMediaElement.NetworkState
- Web.HTML.HTMLMediaElement.ReadyState
- Web.HTML.HTMLMetaElement
- Web.HTML.HTMLMeterElement
- Web.HTML.HTMLModElement
- Web.HTML.HTMLOListElement
- Web.HTML.HTMLObjectElement
- Web.HTML.HTMLOptGroupElement
- Web.HTML.HTMLOptionElement
- Web.HTML.HTMLOutputElement
- Web.HTML.HTMLParagraphElement
- Web.HTML.HTMLParamElement
- Web.HTML.HTMLPreElement
- Web.HTML.HTMLProgressElement
- Web.HTML.HTMLQuoteElement
- Web.HTML.HTMLScriptElement
- Web.HTML.HTMLSelectElement
- Web.HTML.HTMLSourceElement
- Web.HTML.HTMLSpanElement
- Web.HTML.HTMLStyleElement
- Web.HTML.HTMLTableCaptionElement
- Web.HTML.HTMLTableCellElement
- Web.HTML.HTMLTableColElement
- Web.HTML.HTMLTableDataCellElement
- Web.HTML.HTMLTableElement
- Web.HTML.HTMLTableHeaderCellElement
- Web.HTML.HTMLTableRowElement
- Web.HTML.HTMLTableSectionElement
- Web.HTML.HTMLTemplateElement
- Web.HTML.HTMLTextAreaElement
- Web.HTML.HTMLTimeElement
- Web.HTML.HTMLTitleElement
- Web.HTML.HTMLTrackElement
- Web.HTML.HTMLTrackElement.ReadyState
- Web.HTML.HTMLUListElement
- Web.HTML.HTMLVideoElement
- Web.HTML.History
- Web.HTML.Location
- Web.HTML.Navigator
- Web.HTML.SelectionMode
- Web.HTML.ValidityState
- Web.HTML.Window
- Web.Internal.FFI
- Web.Promise
- Web.Promise.Internal
- Web.Promise.Lazy
- Web.Promise.Rejection
- Web.ResizeObserver
- Web.Socket.BinaryType
- Web.Socket.Event.CloseEvent
- Web.Socket.Event.EventTypes
- Web.Socket.Event.MessageEvent
- Web.Socket.ReadyState
- Web.Socket.WebSocket
- Web.Storage.Event.StorageEvent
- Web.Storage.Storage
- Web.Streams.QueuingStrategy
- Web.Streams.ReadableStream
- Web.Streams.ReadableStreamController
- Web.Streams.Reader
- Web.Streams.Source
- Web.TouchEvent
- Web.TouchEvent.EventTypes
- Web.TouchEvent.Touch
- Web.TouchEvent.TouchEvent
- Web.TouchEvent.TouchList
- Web.UIEvent.CompositionEvent
- Web.UIEvent.CompositionEvent.EventTypes
- Web.UIEvent.EventTypes
- Web.UIEvent.FocusEvent
- Web.UIEvent.FocusEvent.EventTypes
- Web.UIEvent.InputEvent
- Web.UIEvent.InputEvent.EventTypes
- Web.UIEvent.KeyboardEvent
- Web.UIEvent.KeyboardEvent.EventTypes
- Web.UIEvent.MouseEvent
- Web.UIEvent.MouseEvent.EventTypes
- Web.UIEvent.UIEvent
- Web.UIEvent.WheelEvent
- Web.UIEvent.WheelEvent.EventTypes
- Web.XHR.EventTypes
- Web.XHR.FormData
- Web.XHR.ProgressEvent
- Web.XHR.ReadyState
- Web.XHR.ResponseType
- Web.XHR.XMLHttpRequest
- Web.XHR.XMLHttpRequestUpload
- Which
- Zeta
- Zeta.Compat
- Zeta.DOM
- Zeta.Extra
- Zeta.Time
- Zeta.Types
Heterogeneous type class for the getTouchedField function