{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE AllowAmbiguousTypes #-}
{-# LANGUAGE InstanceSigs, UndecidableInstances, AllowAmbiguousTypes, ScopedTypeVariables, IncoherentInstances #-}
module IHP.View.Form where
import IHP.Prelude
import IHP.ValidationSupport
import IHP.HSX.ConvertibleStrings ()
import IHP.ViewErrorMessages ()
import IHP.ViewSupport
import qualified Text.Blaze.Html5 as Html5
import IHP.HSX.ToHtml
import GHC.Types
import IHP.ModelSupport (getModelName, inputValue, isNew, Id', InputValue)
import IHP.HSX.QQ (hsx)
import IHP.View.Types
import IHP.View.Classes ()
import Network.Wai (pathInfo)
import IHP.Controller.Context
formFor :: forall record. (
?context :: ControllerContext
, ModelFormAction record
, HasField "meta" record MetaBag
) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html5.Html) -> Html5.Html
formFor :: record
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formFor record
record (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody = record
-> (FormContext record -> FormContext record)
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
forall record.
(?context::ControllerContext, ModelFormAction record,
HasField "meta" record MetaBag) =>
record
-> (FormContext record -> FormContext record)
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formForWithOptions @record record
record (\FormContext record
c -> FormContext record
c) (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody
{-# INLINE formFor #-}
formForWithOptions :: forall record. (
?context :: ControllerContext
, ModelFormAction record
, HasField "meta" record MetaBag
) => record -> (FormContext record -> FormContext record) -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html5.Html) -> Html5.Html
formForWithOptions :: record
-> (FormContext record -> FormContext record)
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formForWithOptions record
record FormContext record -> FormContext record
applyOptions (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody = FormContext record
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
forall model.
(?context::ControllerContext) =>
FormContext model
-> ((?context::ControllerContext,
?formContext::FormContext model) =>
Html)
-> Html
buildForm (FormContext record -> FormContext record
applyOptions (record -> FormContext record
forall record.
(?context::ControllerContext, HasField "meta" record MetaBag) =>
record -> FormContext record
createFormContext record
record) { $sel:formAction:FormContext :: Text
formAction = record -> Text
forall record.
(ModelFormAction record, ?context::ControllerContext) =>
record -> Text
modelFormAction record
record }) (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody
{-# INLINE formForWithOptions #-}
formForWithoutJavascript :: forall record. (
?context :: ControllerContext
, ModelFormAction record
, HasField "meta" record MetaBag
) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html5.Html) -> Html5.Html
formForWithoutJavascript :: record
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formForWithoutJavascript record
record (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody = record
-> (FormContext record -> FormContext record)
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
forall record.
(?context::ControllerContext, ModelFormAction record,
HasField "meta" record MetaBag) =>
record
-> (FormContext record -> FormContext record)
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formForWithOptions @record record
record (\FormContext record
formContext -> FormContext record
formContext { $sel:disableJavascriptSubmission:FormContext :: Bool
disableJavascriptSubmission = Bool
True }) (?context::ControllerContext, ?formContext::FormContext record) =>
Html
formBody
{-# INLINE formForWithoutJavascript #-}
formFor' :: forall record. (
?context :: ControllerContext
, HasField "meta" record MetaBag
) => record -> Text -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html5.Html) -> Html5.Html
formFor' :: record
-> Text
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
formFor' record
record Text
action = FormContext record
-> ((?context::ControllerContext,
?formContext::FormContext record) =>
Html)
-> Html
forall model.
(?context::ControllerContext) =>
FormContext model
-> ((?context::ControllerContext,
?formContext::FormContext model) =>
Html)
-> Html
buildForm (record -> FormContext record
forall record.
(?context::ControllerContext, HasField "meta" record MetaBag) =>
record -> FormContext record
createFormContext record
record) { $sel:formAction:FormContext :: Text
formAction = Text
action }
{-# INLINE formFor' #-}
createFormContext :: forall record. (
?context :: ControllerContext
, HasField "meta" record MetaBag
) => record -> FormContext record
createFormContext :: record -> FormContext record
createFormContext record
record =
FormContext :: forall model.
model
-> Text
-> CSSFramework
-> Text
-> Text
-> Bool
-> [(Text, Text)]
-> FormContext model
FormContext
{ $sel:model:FormContext :: record
model = record
record
, $sel:formAction:FormContext :: Text
formAction = Text
""
, $sel:cssFramework:FormContext :: CSSFramework
cssFramework = CSSFramework
(?context::ControllerContext) => CSSFramework
theCSSFramework
, $sel:formId:FormContext :: Text
formId = Text
""
, $sel:formClass:FormContext :: Text
formClass = if record -> Bool
forall model. HasField "meta" model MetaBag => model -> Bool
isNew record
record then Text
"new-form" else Text
"edit-form"
, $sel:customFormAttributes:FormContext :: [(Text, Text)]
customFormAttributes = []
, $sel:disableJavascriptSubmission:FormContext :: Bool
disableJavascriptSubmission = Bool
False
}
{-# INLINE createFormContext #-}
buildForm :: forall model. (?context :: ControllerContext) => FormContext model -> ((?context :: ControllerContext, ?formContext :: FormContext model) => Html5.Html) -> Html5.Html
buildForm :: FormContext model
-> ((?context::ControllerContext,
?formContext::FormContext model) =>
Html)
-> Html
buildForm FormContext model
formContext (?context::ControllerContext, ?formContext::FormContext model) =>
Html
inner =
let
theModel :: model
theModel = FormContext model -> model
forall model. FormContext model -> model
model FormContext model
formContext
action :: Text
action = FormContext model -> Text
forall model. FormContext model -> Text
formAction FormContext model
formContext
formInner :: Html
formInner = let ?formContext = formContext in Html
(?context::ControllerContext, ?formContext::FormContext model) =>
Html
inner
customFormAttributes :: [(Text, Text)]
customFormAttributes = Proxy "customFormAttributes" -> FormContext model -> [(Text, Text)]
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "customFormAttributes" (Proxy "customFormAttributes")
Proxy "customFormAttributes"
#customFormAttributes FormContext model
formContext
in
[hsx|<form method="POST" action={action} id={get #formId formContext} class={get #formClass formContext} data-disable-javascript-submission={get #disableJavascriptSubmission formContext} {...customFormAttributes}>{formInner}</form>|]
{-# INLINE buildForm #-}
submitButton :: forall model. (?formContext :: FormContext model, HasField "meta" model MetaBag, KnownSymbol (GetModelName model)) => SubmitButton
submitButton :: SubmitButton
submitButton =
let
modelName :: Text
modelName = KnownSymbol (GetModelName model) => Text
forall model. KnownSymbol (GetModelName model) => Text
IHP.ModelSupport.getModelName @model
buttonText :: Text
buttonText = Text
modelName Text -> (Text -> Text) -> Text
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Text -> Text
humanize
isNew :: Bool
isNew = model -> Bool
forall model. HasField "meta" model MetaBag => model -> Bool
IHP.ModelSupport.isNew (FormContext model -> model
forall model. FormContext model -> model
model ?formContext::FormContext model
FormContext model
?formContext)
in SubmitButton :: Html -> Text -> CSSFramework -> SubmitButton
SubmitButton
{ $sel:label:SubmitButton :: Html
label = Text -> Html
forall a b. ConvertibleStrings a b => a -> b
cs (Text -> Html) -> Text -> Html
forall a b. (a -> b) -> a -> b
$ (if Bool
isNew then Text
"Create " else Text
"Save ") Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
buttonText
, $sel:buttonClass:SubmitButton :: Text
buttonClass = Text
forall a. Monoid a => a
mempty
, $sel:cssFramework:SubmitButton :: CSSFramework
cssFramework = Proxy "cssFramework" -> FormContext model -> CSSFramework
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "cssFramework" (Proxy "cssFramework")
Proxy "cssFramework"
#cssFramework ?formContext::FormContext model
FormContext model
?formContext
}
{-# INLINE submitButton #-}
textField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
textField :: Proxy fieldName -> FormField
textField Proxy fieldName
field = FormField :: InputType
-> Text
-> Text
-> Text
-> Text
-> Maybe Violation
-> [(Text, Text)]
-> Text
-> Text
-> Bool
-> Bool
-> Bool
-> Bool
-> CSSFramework
-> Text
-> Text
-> Bool
-> Bool
-> FormField
FormField
{ $sel:fieldType:FormField :: InputType
fieldType = InputType
TextInput
, $sel:fieldName:FormField :: Text
fieldName = String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName
, $sel:fieldLabel:FormField :: Text
fieldLabel = Text -> Text
fieldNameToFieldLabel (String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:fieldValue:FormField :: Text
fieldValue = value -> Text
forall a. InputValue a => a -> Text
inputValue ((model -> value
forall k (x :: k) r a. HasField x r a => r -> a
getField @fieldName model
model) :: value)
, $sel:fieldInputId:FormField :: Text
fieldInputId = Text -> Text
forall a b. ConvertibleStrings a b => a -> b
cs (Text -> Text
lcfirst (KnownSymbol (GetModelName model) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @model) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"_" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:validatorResult:FormField :: Maybe Violation
validatorResult = Proxy fieldName -> model -> Maybe Violation
forall (field :: Symbol) model.
(KnownSymbol field, HasField "meta" model MetaBag) =>
Proxy field -> model -> Maybe Violation
getValidationViolation Proxy fieldName
field model
model
, $sel:fieldClass:FormField :: Text
fieldClass = Text
""
, $sel:labelClass:FormField :: Text
labelClass = Text
""
, $sel:disabled:FormField :: Bool
disabled = Bool
False
, $sel:disableLabel:FormField :: Bool
disableLabel = Bool
False
, $sel:disableGroup:FormField :: Bool
disableGroup = Bool
False
, $sel:disableValidationResult:FormField :: Bool
disableValidationResult = Bool
False
, $sel:additionalAttributes:FormField :: [(Text, Text)]
additionalAttributes = []
, $sel:cssFramework:FormField :: CSSFramework
cssFramework = Proxy "cssFramework" -> FormContext model -> CSSFramework
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "cssFramework" (Proxy "cssFramework")
Proxy "cssFramework"
#cssFramework ?formContext::FormContext model
FormContext model
?formContext
, $sel:helpText:FormField :: Text
helpText = Text
""
, $sel:placeholder:FormField :: Text
placeholder = Text
""
, $sel:required:FormField :: Bool
required = Bool
False
, $sel:autofocus:FormField :: Bool
autofocus = Bool
False
}
where
fieldName :: String
fieldName = Proxy fieldName -> String
forall (n :: Symbol) (proxy :: Symbol -> *).
KnownSymbol n =>
proxy n -> String
symbolVal Proxy fieldName
field
FormContext { model
model :: model
$sel:model:FormContext :: forall model. FormContext model -> model
model } = ?formContext::FormContext model
FormContext model
?formContext
{-# INLINE textField #-}
numberField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
numberField :: Proxy fieldName -> FormField
numberField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
NumberInput }
{-# INLINE numberField #-}
textareaField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
textareaField :: Proxy fieldName -> FormField
textareaField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
TextareaInput }
{-# INLINE textareaField #-}
colorField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
colorField :: Proxy fieldName -> FormField
colorField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
ColorInput }
{-# INLINE colorField #-}
emailField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, KnownSymbol (GetModelName model)
, InputValue value
) => Proxy fieldName -> FormField
emailField :: Proxy fieldName -> FormField
emailField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
EmailInput }
{-# INLINE emailField #-}
dateField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
dateField :: Proxy fieldName -> FormField
dateField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
DateInput }
{-# INLINE dateField #-}
passwordField :: forall fieldName model.
( ?formContext :: FormContext model
, HasField fieldName model Text
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
passwordField :: Proxy fieldName -> FormField
passwordField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
PasswordInput }
{-# INLINE passwordField #-}
dateTimeField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
dateTimeField :: Proxy fieldName -> FormField
dateTimeField Proxy fieldName
alpha = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
alpha) { $sel:fieldType:FormField :: InputType
fieldType = InputType
DateTimeInput }
{-# INLINE dateTimeField #-}
hiddenField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
hiddenField :: Proxy fieldName -> FormField
hiddenField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
HiddenInput }
{-# INLINE hiddenField #-}
fileField :: forall fieldName model value.
( ?formContext :: FormContext model
, HasField fieldName model value
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue value
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
fileField :: Proxy fieldName -> FormField
fileField Proxy fieldName
field = (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field) { $sel:fieldType:FormField :: InputType
fieldType = InputType
FileInput }
{-# INLINE fileField #-}
checkboxField :: forall fieldName model.
( ?formContext :: FormContext model
, HasField fieldName model Bool
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> FormField
checkboxField :: Proxy fieldName -> FormField
checkboxField Proxy fieldName
field = FormField :: InputType
-> Text
-> Text
-> Text
-> Text
-> Maybe Violation
-> [(Text, Text)]
-> Text
-> Text
-> Bool
-> Bool
-> Bool
-> Bool
-> CSSFramework
-> Text
-> Text
-> Bool
-> Bool
-> FormField
FormField
{ $sel:fieldType:FormField :: InputType
fieldType = InputType
CheckboxInput
, $sel:fieldName:FormField :: Text
fieldName = String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName
, $sel:fieldLabel:FormField :: Text
fieldLabel = Text -> Text
fieldNameToFieldLabel (String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:fieldValue:FormField :: Text
fieldValue = if model -> Bool
forall k (x :: k) r a. HasField x r a => r -> a
getField @fieldName model
model then Text
"yes" else Text
"no"
, $sel:fieldInputId:FormField :: Text
fieldInputId = Text -> Text
forall a b. ConvertibleStrings a b => a -> b
cs (Text -> Text
lcfirst (KnownSymbol (GetModelName model) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @model) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"_" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:validatorResult:FormField :: Maybe Violation
validatorResult = Proxy fieldName -> model -> Maybe Violation
forall (field :: Symbol) model.
(KnownSymbol field, HasField "meta" model MetaBag) =>
Proxy field -> model -> Maybe Violation
getValidationViolation Proxy fieldName
field model
model
, $sel:fieldClass:FormField :: Text
fieldClass = Text
""
, $sel:labelClass:FormField :: Text
labelClass = Text
""
, $sel:disabled:FormField :: Bool
disabled = Bool
False
, $sel:disableLabel:FormField :: Bool
disableLabel = Bool
False
, $sel:disableGroup:FormField :: Bool
disableGroup = Bool
False
, $sel:disableValidationResult:FormField :: Bool
disableValidationResult = Bool
False
, $sel:additionalAttributes:FormField :: [(Text, Text)]
additionalAttributes = []
, $sel:cssFramework:FormField :: CSSFramework
cssFramework = Proxy "cssFramework" -> FormContext model -> CSSFramework
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "cssFramework" (Proxy "cssFramework")
Proxy "cssFramework"
#cssFramework ?formContext::FormContext model
FormContext model
?formContext
, $sel:helpText:FormField :: Text
helpText = Text
""
, $sel:placeholder:FormField :: Text
placeholder = Text
""
, $sel:required:FormField :: Bool
required = Bool
False
, $sel:autofocus:FormField :: Bool
autofocus = Bool
False
}
where
fieldName :: String
fieldName = Proxy fieldName -> String
forall (n :: Symbol) (proxy :: Symbol -> *).
KnownSymbol n =>
proxy n -> String
symbolVal Proxy fieldName
field
FormContext { model
model :: model
$sel:model:FormContext :: forall model. FormContext model -> model
model } = ?formContext::FormContext model
FormContext model
?formContext
{-# INLINE checkboxField #-}
selectField :: forall fieldName model item.
( ?formContext :: FormContext model
, HasField fieldName model (SelectValue item)
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, KnownSymbol (GetModelName model)
, CanSelect item
, InputValue (SelectValue item)
) => Proxy fieldName -> [item] -> FormField
selectField :: Proxy fieldName -> [item] -> FormField
selectField Proxy fieldName
field [item]
items = FormField :: InputType
-> Text
-> Text
-> Text
-> Text
-> Maybe Violation
-> [(Text, Text)]
-> Text
-> Text
-> Bool
-> Bool
-> Bool
-> Bool
-> CSSFramework
-> Text
-> Text
-> Bool
-> Bool
-> FormField
FormField
{ $sel:fieldType:FormField :: InputType
fieldType =
let
itemToTuple :: item -> (Text, Text)
itemToTuple :: item -> (Text, Text)
itemToTuple item
item = (item -> Text
forall model. CanSelect model => model -> Text
selectLabel item
item, SelectValue item -> Text
forall a. InputValue a => a -> Text
inputValue (item -> SelectValue item
forall model. CanSelect model => model -> SelectValue model
selectValue item
item))
in
[(Text, Text)] -> InputType
SelectInput ((item -> (Text, Text)) -> [item] -> [(Text, Text)]
forall a b. (a -> b) -> [a] -> [b]
map item -> (Text, Text)
itemToTuple [item]
items)
, $sel:fieldName:FormField :: Text
fieldName = String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName
, $sel:fieldLabel:FormField :: Text
fieldLabel = Text -> Text
removeIdSuffix (Text -> Text) -> Text -> Text
forall a b. (a -> b) -> a -> b
$ Text -> Text
fieldNameToFieldLabel (String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:fieldValue:FormField :: Text
fieldValue = SelectValue item -> Text
forall a. InputValue a => a -> Text
inputValue ((model -> SelectValue item
forall k (x :: k) r a. HasField x r a => r -> a
getField @fieldName model
model :: SelectValue item))
, $sel:fieldInputId:FormField :: Text
fieldInputId = Text -> Text
forall a b. ConvertibleStrings a b => a -> b
cs (Text -> Text
lcfirst (KnownSymbol (GetModelName model) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @model) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"_" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> String -> Text
forall a b. ConvertibleStrings a b => a -> b
cs String
fieldName)
, $sel:validatorResult:FormField :: Maybe Violation
validatorResult = Proxy fieldName -> model -> Maybe Violation
forall (field :: Symbol) model.
(KnownSymbol field, HasField "meta" model MetaBag) =>
Proxy field -> model -> Maybe Violation
getValidationViolation Proxy fieldName
field model
model
, $sel:fieldClass:FormField :: Text
fieldClass = Text
""
, $sel:labelClass:FormField :: Text
labelClass = Text
""
, $sel:disabled:FormField :: Bool
disabled = Bool
False
, $sel:disableLabel:FormField :: Bool
disableLabel = Bool
False
, $sel:disableGroup:FormField :: Bool
disableGroup = Bool
False
, $sel:disableValidationResult:FormField :: Bool
disableValidationResult = Bool
False
, $sel:additionalAttributes:FormField :: [(Text, Text)]
additionalAttributes = []
, $sel:cssFramework:FormField :: CSSFramework
cssFramework = Proxy "cssFramework" -> FormContext model -> CSSFramework
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "cssFramework" (Proxy "cssFramework")
Proxy "cssFramework"
#cssFramework ?formContext::FormContext model
FormContext model
?formContext
, $sel:helpText:FormField :: Text
helpText = Text
""
, $sel:placeholder:FormField :: Text
placeholder = Text
"Please select"
, $sel:required:FormField :: Bool
required = Bool
False
, $sel:autofocus:FormField :: Bool
autofocus = Bool
False
}
where
fieldName :: String
fieldName = Proxy fieldName -> String
forall (n :: Symbol) (proxy :: Symbol -> *).
KnownSymbol n =>
proxy n -> String
symbolVal Proxy fieldName
field
FormContext { model
model :: model
$sel:model:FormContext :: forall model. FormContext model -> model
model } = ?formContext::FormContext model
FormContext model
?formContext
{-# INLINE selectField #-}
class CanSelect model where
type SelectValue model :: GHC.Types.Type
selectLabel :: model -> Text
default selectLabel :: Show model => model -> Text
selectLabel = model -> Text
forall a. Show a => a -> Text
tshow
selectValue :: model -> SelectValue model
default selectValue :: HasField "id" model (SelectValue model) => model -> SelectValue model
selectValue = forall k (x :: k) r a. HasField x r a => r -> a
forall r a. HasField "id" r a => r -> a
getField @"id"
instance ToHtml FormField where
{-# INLINE toHtml #-}
toHtml :: FormField -> Html5.Html
toHtml :: FormField -> Html
toHtml formField :: FormField
formField@(FormField { CSSFramework
cssFramework :: CSSFramework
$sel:cssFramework:FormField :: FormField -> CSSFramework
cssFramework }) = CSSFramework -> CSSFramework -> FormField -> Html
styledFormField CSSFramework
cssFramework CSSFramework
cssFramework FormField
formField
instance ToHtml SubmitButton where
{-# INLINE toHtml #-}
toHtml :: SubmitButton -> Html
toHtml submitButton :: SubmitButton
submitButton@(SubmitButton { CSSFramework
cssFramework :: CSSFramework
$sel:cssFramework:SubmitButton :: SubmitButton -> CSSFramework
cssFramework }) = CSSFramework -> CSSFramework -> SubmitButton -> Html
styledSubmitButton CSSFramework
cssFramework CSSFramework
cssFramework SubmitButton
submitButton
class ModelFormAction record where
modelFormAction :: (?context :: ControllerContext) => record -> Text
instance
( HasField "id" record (Id' (GetTableName record))
, HasField "meta" record MetaBag
, KnownSymbol (GetModelName record)
, Show (Id' (GetTableName record))
) => ModelFormAction record where
modelFormAction :: record -> Text
modelFormAction record
record =
let
path :: [Text]
path = Request
(?context::ControllerContext) => Request
theRequest Request -> (Request -> [Text]) -> [Text]
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Proxy "pathInfo" -> Request -> [Text]
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "pathInfo" (Proxy "pathInfo")
Proxy "pathInfo"
#pathInfo
action :: Text
action = if record -> Bool
forall model. HasField "meta" model MetaBag => model -> Bool
isNew record
record
then Text
"Create" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> KnownSymbol (GetModelName record) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @record
else Text
"Update" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> KnownSymbol (GetModelName record) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @record Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"?" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text -> Text
lcfirst (KnownSymbol (GetModelName record) => Text
forall model. KnownSymbol (GetModelName model) => Text
getModelName @record) Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"Id=" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Id' (GetTableName record) -> Text
forall a. Show a => a -> Text
tshow (Proxy "id" -> record -> Id' (GetTableName record)
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "id" (Proxy "id")
Proxy "id"
#id record
record)
in
[Text] -> Maybe [Text]
forall a. [a] -> Maybe [a]
init [Text]
path
Maybe [Text] -> (Maybe [Text] -> [Text]) -> [Text]
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> (\Maybe [Text]
path -> [Text
""] [Text] -> [Text] -> [Text]
forall a. Semigroup a => a -> a -> a
<> ([Text] -> Maybe [Text] -> [Text]
forall a. a -> Maybe a -> a
fromMaybe [] Maybe [Text]
path) [Text] -> [Text] -> [Text]
forall a. Semigroup a => a -> a -> a
<> [Text
action])
[Text] -> ([Text] -> Text) -> Text
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Text -> [Text] -> Text
intercalate Text
"/"
validationResult :: forall fieldName model fieldType.
( ?formContext :: FormContext model
, HasField fieldName model fieldType
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, InputValue fieldType
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> Html
validationResult :: Proxy fieldName -> Html
validationResult Proxy fieldName
field = CSSFramework -> CSSFramework -> FormField -> Html
styledValidationResult CSSFramework
cssFramework CSSFramework
cssFramework (Proxy fieldName -> FormField
forall (fieldName :: Symbol) model value.
(?formContext::FormContext model, HasField fieldName model value,
HasField "meta" model MetaBag, KnownSymbol fieldName,
InputValue value, KnownSymbol (GetModelName model)) =>
Proxy fieldName -> FormField
textField Proxy fieldName
field)
where
result :: Maybe Text
result = Proxy fieldName -> model -> Maybe Text
forall (field :: Symbol) model.
(KnownSymbol field, HasField "meta" model MetaBag) =>
Proxy field -> model -> Maybe Text
getValidationFailure Proxy fieldName
field model
model
model :: model
model = ?formContext::FormContext model
FormContext model
?formContext FormContext model -> (FormContext model -> model) -> model
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Proxy "model" -> FormContext model -> model
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "model" (Proxy "model")
Proxy "model"
#model
cssFramework :: CSSFramework
cssFramework = ?formContext::FormContext model
FormContext model
?formContext FormContext model
-> (FormContext model -> CSSFramework) -> CSSFramework
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Proxy "cssFramework" -> FormContext model -> CSSFramework
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "cssFramework" (Proxy "cssFramework")
Proxy "cssFramework"
#cssFramework
validationResultMaybe :: forall fieldName model fieldType.
( ?formContext :: FormContext model
, HasField fieldName model fieldType
, HasField "meta" model MetaBag
, KnownSymbol fieldName
, KnownSymbol (GetModelName model)
) => Proxy fieldName -> Maybe Text
validationResultMaybe :: Proxy fieldName -> Maybe Text
validationResultMaybe Proxy fieldName
field = Proxy fieldName -> model -> Maybe Text
forall (field :: Symbol) model.
(KnownSymbol field, HasField "meta" model MetaBag) =>
Proxy field -> model -> Maybe Text
getValidationFailure Proxy fieldName
field model
model
where
model :: model
model = ?formContext::FormContext model
FormContext model
?formContext FormContext model -> (FormContext model -> model) -> model
forall t1 t2. t1 -> (t1 -> t2) -> t2
|> Proxy "model" -> FormContext model -> model
forall model (name :: Symbol) value.
(KnownSymbol name, HasField name model value) =>
Proxy name -> model -> value
get IsLabel "model" (Proxy "model")
Proxy "model"
#model