reflex-dom-core-0.5: Functional Reactive Web Apps with Reflex

Safe HaskellNone
LanguageHaskell98

Reflex.Dom.Widget.Input

Synopsis

Documentation

data DropdownConfig t k Source #

Instances
Reflex t => Default (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Methods

def :: DropdownConfig t k2 #

HasAttributes (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Attrs (DropdownConfig t k2) :: * Source #

HasSetValue (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (DropdownConfig t k2) :: * Source #

type Attrs (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type SetValue (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type SetValue (DropdownConfig t k2) = Event t k2

data Dropdown t k Source #

Constructors

Dropdown 
Instances
HasValue (Dropdown t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (Dropdown t k2) :: * Source #

Methods

value :: Dropdown t k2 -> Value (Dropdown t k2) Source #

type Value (Dropdown t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type Value (Dropdown t k2) = Dynamic t k2

newtype FileInputConfig t Source #

Instances
Reflex t => Default (FileInputConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Methods

def :: FileInputConfig t #

HasAttributes (FileInputConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Attrs (FileInputConfig t) :: * Source #

type Attrs (FileInputConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

data FileInput d t Source #

Instances
HasValue (FileInput d t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (FileInput d t) :: * Source #

Methods

value :: FileInput d t -> Value (FileInput d t) Source #

type Value (FileInput d t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type Value (FileInput d t) = Dynamic t [File]

data Checkbox t Source #

Instances
HasValue (Checkbox t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (Checkbox t) :: * Source #

Methods

value :: Checkbox t -> Value (Checkbox t) Source #

type Value (Checkbox t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type Value (Checkbox t) = Dynamic t Bool

data CheckboxConfig t Source #

Instances
Reflex t => Default (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Methods

def :: CheckboxConfig t #

HasAttributes (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Attrs (CheckboxConfig t) :: * Source #

HasSetValue (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (CheckboxConfig t) :: * Source #

type Attrs (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type SetValue (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

data TextArea t Source #

Instances
HasValue (TextArea t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (TextArea t) :: * Source #

Methods

value :: TextArea t -> Value (TextArea t) Source #

type Value (TextArea t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type Value (TextArea t) = Dynamic t Text

data TextInput t Source #

Instances
Reflex t => HasDomEvent (t :: k) (TextInput t) en Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type DomEventType (TextInput t) en :: * Source #

HasValue (TextInput t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (TextInput t) :: * Source #

Methods

value :: TextInput t -> Value (TextInput t) Source #

type Value (TextInput t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

type DomEventType (TextInput t) en Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

textInput :: (DomBuilder t m, PostBuild t m, DomBuilderSpace m ~ GhcjsDomSpace) => TextInputConfig t -> m (TextInput t) Source #

Create an input whose value is a string. By default, the "type" attribute is set to "text", but it can be changed using the _textInputConfig_inputType field. Note that only types for which the value is always a string will work - types whose value may be null will not work properly with this widget.

textInputGetEnter :: Reflex t => TextInput t -> Event t () Source #

Deprecated: Use 'keypress Enter' instead

checkbox :: (DomBuilder t m, PostBuild t m) => Bool -> CheckboxConfig t -> m (Checkbox t) Source #

Create an editable checkbox Note: if the "type" or "checked" attributes are provided as attributes, they will be ignored

dropdown :: forall k t m. (DomBuilder t m, MonadFix m, MonadHold t m, PostBuild t m, Ord k) => k -> Dynamic t (Map k Text) -> DropdownConfig t k -> m (Dropdown t k) Source #

Create a dropdown box The first argument gives the initial value of the dropdown; if it is not present in the map of options provided, it will be added with an empty string as its text

class HasValue a where Source #

Minimal complete definition

value

Associated Types

type Value a :: * Source #

Methods

value :: a -> Value a Source #

Instances
HasValue (Checkbox t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (Checkbox t) :: * Source #

Methods

value :: Checkbox t -> Value (Checkbox t) Source #

HasValue (TextArea t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (TextArea t) :: * Source #

Methods

value :: TextArea t -> Value (TextArea t) Source #

HasValue (RangeInput t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (RangeInput t) :: * Source #

HasValue (TextInput t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (TextInput t) :: * Source #

Methods

value :: TextInput t -> Value (TextInput t) Source #

HasValue (Dropdown t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (Dropdown t k2) :: * Source #

Methods

value :: Dropdown t k2 -> Value (Dropdown t k2) Source #

HasValue (FileInput d t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (FileInput d t) :: * Source #

Methods

value :: FileInput d t -> Value (FileInput d t) Source #

HasValue (TextAreaElement er d t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (TextAreaElement er d t) :: * Source #

Methods

value :: TextAreaElement er d t -> Value (TextAreaElement er d t) Source #

HasValue (InputElement er d t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type Value (InputElement er d t) :: * Source #

Methods

value :: InputElement er d t -> Value (InputElement er d t) Source #

class HasSetValue a where Source #

Minimal complete definition

setValue

Associated Types

type SetValue a :: * Source #

Methods

setValue :: Lens' a (SetValue a) Source #

Instances
HasSetValue (CheckboxConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (CheckboxConfig t) :: * Source #

HasSetValue (TextAreaConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (TextAreaConfig t) :: * Source #

HasSetValue (RangeInputConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (RangeInputConfig t) :: * Source #

HasSetValue (TextInputConfig t) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (TextInputConfig t) :: * Source #

HasSetValue (DropdownConfig t k2) Source # 
Instance details

Defined in Reflex.Dom.Widget.Input

Associated Types

type SetValue (DropdownConfig t k2) :: * Source #

fileInput_value :: forall d t t. Lens (FileInput d t) (FileInput d t) (Dynamic t [File]) (Dynamic t [File]) Source #

dropdownConfig_setValue :: forall t k k. Lens (DropdownConfig t k) (DropdownConfig t k) (Event t k) (Event t k) Source #

dropdown_change :: forall t k. Lens' (Dropdown t k) (Event t k) Source #

dropdown_value :: forall t k. Lens' (Dropdown t k) (Dynamic t k) Source #

def :: Default a => a #

The default value for this type.

(&) :: a -> (a -> b) -> b infixl 1 #

& is a reverse application operator. This provides notational convenience. Its precedence is one higher than that of the forward application operator $, which allows & to be nested in $.

>>> 5 & (+1) & show
"6"

Since: base-4.8.0.0

(.~) :: ASetter s t a b -> b -> s -> t infixr 4 #

Replace the target of a Lens or all of the targets of a Setter or Traversal with a constant value.

This is an infix version of set, provided for consistency with (.=).

f <$ a ≡ mapped .~ f $ a
>>> (a,b,c,d) & _4 .~ e
(a,b,c,e)
>>> (42,"world") & _1 .~ "hello"
("hello","world")
>>> (a,b) & both .~ c
(c,c)
(.~) :: Setter s t a b    -> b -> s -> t
(.~) :: Iso s t a b       -> b -> s -> t
(.~) :: Lens s t a b      -> b -> s -> t
(.~) :: Traversal s t a b -> b -> s -> t