{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE OverloadedStrings #-}
module Yesod.Form.Bootstrap3
(
renderBootstrap3
, BootstrapFormLayout(..)
, BootstrapGridOptions(..)
, bfs
, withPlaceholder
, withAutofocus
, withLargeInput
, withSmallInput
, bootstrapSubmit
, mbootstrapSubmit
, BootstrapSubmit(..)
) where
import Control.Arrow (second)
import Control.Monad (liftM)
import Data.Text (Text)
import Data.String (IsString(..))
import qualified Text.Blaze.Internal as Blaze
import Yesod.Core
import Yesod.Form.Types
import Yesod.Form.Functions
bfs :: RenderMessage site msg => msg -> FieldSettings site
bfs :: forall site msg.
RenderMessage site msg =>
msg -> FieldSettings site
bfs msg
msg =
forall master.
SomeMessage master
-> Maybe (SomeMessage master)
-> Maybe Text
-> Maybe Text
-> [(Text, Text)]
-> FieldSettings master
FieldSettings (forall master msg.
RenderMessage master msg =>
msg -> SomeMessage master
SomeMessage msg
msg) forall a. Maybe a
Nothing forall a. Maybe a
Nothing forall a. Maybe a
Nothing [(Text
"class", Text
"form-control")]
withPlaceholder :: Text -> FieldSettings site -> FieldSettings site
withPlaceholder :: forall site. Text -> FieldSettings site -> FieldSettings site
withPlaceholder Text
placeholder FieldSettings site
fs = FieldSettings site
fs { fsAttrs :: [(Text, Text)]
fsAttrs = [(Text, Text)]
newAttrs }
where newAttrs :: [(Text, Text)]
newAttrs = (Text
"placeholder", Text
placeholder) forall a. a -> [a] -> [a]
: forall master. FieldSettings master -> [(Text, Text)]
fsAttrs FieldSettings site
fs
withAutofocus :: FieldSettings site -> FieldSettings site
withAutofocus :: forall site. FieldSettings site -> FieldSettings site
withAutofocus FieldSettings site
fs = FieldSettings site
fs { fsAttrs :: [(Text, Text)]
fsAttrs = [(Text, Text)]
newAttrs }
where newAttrs :: [(Text, Text)]
newAttrs = (Text
"autofocus", Text
"autofocus") forall a. a -> [a] -> [a]
: forall master. FieldSettings master -> [(Text, Text)]
fsAttrs FieldSettings site
fs
withLargeInput :: FieldSettings site -> FieldSettings site
withLargeInput :: forall site. FieldSettings site -> FieldSettings site
withLargeInput FieldSettings site
fs = FieldSettings site
fs { fsAttrs :: [(Text, Text)]
fsAttrs = [(Text, Text)]
newAttrs }
where newAttrs :: [(Text, Text)]
newAttrs = Text -> [(Text, Text)] -> [(Text, Text)]
addClass Text
"input-lg" (forall master. FieldSettings master -> [(Text, Text)]
fsAttrs FieldSettings site
fs)
withSmallInput :: FieldSettings site -> FieldSettings site
withSmallInput :: forall site. FieldSettings site -> FieldSettings site
withSmallInput FieldSettings site
fs = FieldSettings site
fs { fsAttrs :: [(Text, Text)]
fsAttrs = [(Text, Text)]
newAttrs }
where newAttrs :: [(Text, Text)]
newAttrs = Text -> [(Text, Text)] -> [(Text, Text)]
addClass Text
"input-sm" (forall master. FieldSettings master -> [(Text, Text)]
fsAttrs FieldSettings site
fs)
data BootstrapGridOptions =
ColXs !Int
| ColSm !Int
| ColMd !Int
| ColLg !Int
deriving (BootstrapGridOptions -> BootstrapGridOptions -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c/= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
== :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c== :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
Eq, Eq BootstrapGridOptions
BootstrapGridOptions -> BootstrapGridOptions -> Bool
BootstrapGridOptions -> BootstrapGridOptions -> Ordering
BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
$cmin :: BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
max :: BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
$cmax :: BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
>= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c>= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
> :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c> :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
<= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c<= :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
< :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
$c< :: BootstrapGridOptions -> BootstrapGridOptions -> Bool
compare :: BootstrapGridOptions -> BootstrapGridOptions -> Ordering
$ccompare :: BootstrapGridOptions -> BootstrapGridOptions -> Ordering
Ord, Int -> BootstrapGridOptions -> ShowS
[BootstrapGridOptions] -> ShowS
BootstrapGridOptions -> [Char]
forall a.
(Int -> a -> ShowS) -> (a -> [Char]) -> ([a] -> ShowS) -> Show a
showList :: [BootstrapGridOptions] -> ShowS
$cshowList :: [BootstrapGridOptions] -> ShowS
show :: BootstrapGridOptions -> [Char]
$cshow :: BootstrapGridOptions -> [Char]
showsPrec :: Int -> BootstrapGridOptions -> ShowS
$cshowsPrec :: Int -> BootstrapGridOptions -> ShowS
Show)
toColumn :: BootstrapGridOptions -> String
toColumn :: BootstrapGridOptions -> [Char]
toColumn (ColXs Int
0) = [Char]
""
toColumn (ColSm Int
0) = [Char]
""
toColumn (ColMd Int
0) = [Char]
""
toColumn (ColLg Int
0) = [Char]
""
toColumn (ColXs Int
columns) = [Char]
"col-xs-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toColumn (ColSm Int
columns) = [Char]
"col-sm-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toColumn (ColMd Int
columns) = [Char]
"col-md-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toColumn (ColLg Int
columns) = [Char]
"col-lg-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toOffset :: BootstrapGridOptions -> String
toOffset :: BootstrapGridOptions -> [Char]
toOffset (ColXs Int
0) = [Char]
""
toOffset (ColSm Int
0) = [Char]
""
toOffset (ColMd Int
0) = [Char]
""
toOffset (ColLg Int
0) = [Char]
""
toOffset (ColXs Int
columns) = [Char]
"col-xs-offset-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toOffset (ColSm Int
columns) = [Char]
"col-sm-offset-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toOffset (ColMd Int
columns) = [Char]
"col-md-offset-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
toOffset (ColLg Int
columns) = [Char]
"col-lg-offset-" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> [Char]
show Int
columns
addGO :: BootstrapGridOptions -> BootstrapGridOptions -> BootstrapGridOptions
addGO :: BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
addGO (ColXs Int
a) (ColXs Int
b) = Int -> BootstrapGridOptions
ColXs (Int
aforall a. Num a => a -> a -> a
+Int
b)
addGO (ColSm Int
a) (ColSm Int
b) = Int -> BootstrapGridOptions
ColSm (Int
aforall a. Num a => a -> a -> a
+Int
b)
addGO (ColMd Int
a) (ColMd Int
b) = Int -> BootstrapGridOptions
ColMd (Int
aforall a. Num a => a -> a -> a
+Int
b)
addGO (ColLg Int
a) (ColLg Int
b) = Int -> BootstrapGridOptions
ColLg (Int
aforall a. Num a => a -> a -> a
+Int
b)
addGO BootstrapGridOptions
a BootstrapGridOptions
b | BootstrapGridOptions
a forall a. Ord a => a -> a -> Bool
> BootstrapGridOptions
b = BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
addGO BootstrapGridOptions
b BootstrapGridOptions
a
addGO (ColXs Int
a) BootstrapGridOptions
other = BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
addGO (Int -> BootstrapGridOptions
ColSm Int
a) BootstrapGridOptions
other
addGO (ColSm Int
a) BootstrapGridOptions
other = BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
addGO (Int -> BootstrapGridOptions
ColMd Int
a) BootstrapGridOptions
other
addGO (ColMd Int
a) BootstrapGridOptions
other = BootstrapGridOptions
-> BootstrapGridOptions -> BootstrapGridOptions
addGO (Int -> BootstrapGridOptions
ColLg Int
a) BootstrapGridOptions
other
addGO (ColLg Int
_) BootstrapGridOptions
_ = forall a. HasCallStack => [Char] -> a
error [Char]
"Yesod.Form.Bootstrap.addGO: never here"
data BootstrapFormLayout =
BootstrapBasicForm
| BootstrapInlineForm
| BootstrapHorizontalForm
{ BootstrapFormLayout -> BootstrapGridOptions
bflLabelOffset :: !BootstrapGridOptions
, BootstrapFormLayout -> BootstrapGridOptions
bflLabelSize :: !BootstrapGridOptions
, BootstrapFormLayout -> BootstrapGridOptions
bflInputOffset :: !BootstrapGridOptions
, BootstrapFormLayout -> BootstrapGridOptions
bflInputSize :: !BootstrapGridOptions
}
deriving (Int -> BootstrapFormLayout -> ShowS
[BootstrapFormLayout] -> ShowS
BootstrapFormLayout -> [Char]
forall a.
(Int -> a -> ShowS) -> (a -> [Char]) -> ([a] -> ShowS) -> Show a
showList :: [BootstrapFormLayout] -> ShowS
$cshowList :: [BootstrapFormLayout] -> ShowS
show :: BootstrapFormLayout -> [Char]
$cshow :: BootstrapFormLayout -> [Char]
showsPrec :: Int -> BootstrapFormLayout -> ShowS
$cshowsPrec :: Int -> BootstrapFormLayout -> ShowS
Show)
renderBootstrap3 :: Monad m => BootstrapFormLayout -> FormRender m a
renderBootstrap3 :: forall (m :: * -> *) a.
Monad m =>
BootstrapFormLayout -> FormRender m a
renderBootstrap3 BootstrapFormLayout
formLayout AForm m a
aform Html
fragment = do
(FormResult a
res, [FieldView (HandlerSite m)] -> [FieldView (HandlerSite m)]
views') <- forall (m :: * -> *) site a.
(Monad m, HandlerSite m ~ site) =>
AForm m a
-> MForm m (FormResult a, [FieldView site] -> [FieldView site])
aFormToForm AForm m a
aform
let views :: [FieldView (HandlerSite m)]
views = [FieldView (HandlerSite m)] -> [FieldView (HandlerSite m)]
views' []
has :: Maybe a -> Bool
has (Just a
_) = Bool
True
has Maybe a
Nothing = Bool
False
widget :: WidgetFor (HandlerSite m) ()
widget = [whamlet|
$newline never
#{fragment}
$forall view <- views
<div .form-group :fvRequired view:.required :not $ fvRequired view:.optional :has $ fvErrors view:.has-error>
$case formLayout
$of BootstrapBasicForm
$if fvId view /= bootstrapSubmitId
<label :Blaze.null (fvLabel view):.sr-only for=#{fvId view}>#{fvLabel view}
^{fvInput view}
^{helpWidget view}
$of BootstrapInlineForm
$if fvId view /= bootstrapSubmitId
<label .sr-only for=#{fvId view}>#{fvLabel view}
^{fvInput view}
^{helpWidget view}
$of BootstrapHorizontalForm labelOffset labelSize inputOffset inputSize
$if fvId view /= bootstrapSubmitId
<label :Blaze.null (fvLabel view):.sr-only .control-label .#{toOffset labelOffset} .#{toColumn labelSize} for=#{fvId view}>#{fvLabel view}
<div .#{toOffset inputOffset} .#{toColumn inputSize}>
^{fvInput view}
^{helpWidget view}
$else
<div .#{toOffset (addGO inputOffset (addGO labelOffset labelSize))} .#{toColumn inputSize}>
^{fvInput view}
^{helpWidget view}
|]
forall (m :: * -> *) a. Monad m => a -> m a
return (FormResult a
res, WidgetFor (HandlerSite m) ()
widget)
helpWidget :: FieldView site -> WidgetFor site ()
helpWidget :: forall site. FieldView site -> WidgetFor site ()
helpWidget FieldView site
view = [whamlet|
$maybe tt <- fvTooltip view
<span .help-block>#{tt}
$maybe err <- fvErrors view
<span .help-block .error-block>#{err}
|]
data BootstrapSubmit msg =
BootstrapSubmit
{ forall msg. BootstrapSubmit msg -> msg
bsValue :: msg
, forall msg. BootstrapSubmit msg -> Text
bsClasses :: Text
, forall msg. BootstrapSubmit msg -> [(Text, Text)]
bsAttrs :: [(Text, Text)]
} deriving (Int -> BootstrapSubmit msg -> ShowS
forall msg. Show msg => Int -> BootstrapSubmit msg -> ShowS
forall msg. Show msg => [BootstrapSubmit msg] -> ShowS
forall msg. Show msg => BootstrapSubmit msg -> [Char]
forall a.
(Int -> a -> ShowS) -> (a -> [Char]) -> ([a] -> ShowS) -> Show a
showList :: [BootstrapSubmit msg] -> ShowS
$cshowList :: forall msg. Show msg => [BootstrapSubmit msg] -> ShowS
show :: BootstrapSubmit msg -> [Char]
$cshow :: forall msg. Show msg => BootstrapSubmit msg -> [Char]
showsPrec :: Int -> BootstrapSubmit msg -> ShowS
$cshowsPrec :: forall msg. Show msg => Int -> BootstrapSubmit msg -> ShowS
Show)
instance IsString msg => IsString (BootstrapSubmit msg) where
fromString :: [Char] -> BootstrapSubmit msg
fromString [Char]
msg = forall msg. msg -> Text -> [(Text, Text)] -> BootstrapSubmit msg
BootstrapSubmit (forall a. IsString a => [Char] -> a
fromString [Char]
msg) Text
" btn-default " []
bootstrapSubmit
:: (RenderMessage site msg, HandlerSite m ~ site, MonadHandler m)
=> BootstrapSubmit msg -> AForm m ()
bootstrapSubmit :: forall site msg (m :: * -> *).
(RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) =>
BootstrapSubmit msg -> AForm m ()
bootstrapSubmit = forall (m :: * -> *) site a.
(HandlerSite m ~ site, Monad m) =>
MForm m (FormResult a, [FieldView site]) -> AForm m a
formToAForm forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (m :: * -> *) a1 r. Monad m => (a1 -> r) -> m a1 -> m r
liftM (forall (a :: * -> * -> *) b c d.
Arrow a =>
a b c -> a (d, b) (d, c)
second forall (m :: * -> *) a. Monad m => a -> m a
return) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall site msg (m :: * -> *).
(RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) =>
BootstrapSubmit msg -> MForm m (FormResult (), FieldView site)
mbootstrapSubmit
mbootstrapSubmit
:: (RenderMessage site msg, HandlerSite m ~ site, MonadHandler m)
=> BootstrapSubmit msg -> MForm m (FormResult (), FieldView site)
mbootstrapSubmit :: forall site msg (m :: * -> *).
(RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) =>
BootstrapSubmit msg -> MForm m (FormResult (), FieldView site)
mbootstrapSubmit (BootstrapSubmit msg
msg Text
classes [(Text, Text)]
attrs) =
let res :: FormResult ()
res = forall a. a -> FormResult a
FormSuccess ()
widget :: WidgetFor site ()
widget = [whamlet|<button class="btn #{classes}" type=submit *{attrs}>_{msg}|]
fv :: FieldView site
fv = FieldView { fvLabel :: Html
fvLabel = Html
""
, fvTooltip :: Maybe Html
fvTooltip = forall a. Maybe a
Nothing
, fvId :: Text
fvId = Text
bootstrapSubmitId
, fvInput :: WidgetFor site ()
fvInput = WidgetFor site ()
widget
, fvErrors :: Maybe Html
fvErrors = forall a. Maybe a
Nothing
, fvRequired :: Bool
fvRequired = Bool
False }
in forall (m :: * -> *) a. Monad m => a -> m a
return (FormResult ()
res, FieldView site
fv)
bootstrapSubmitId :: Text
bootstrapSubmitId :: Text
bootstrapSubmitId = Text
"b:ootstrap___unique__:::::::::::::::::submit-id"