{-# LANGUAGE OverloadedStrings #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  Miso.Html.Element
-- Copyright   :  (C) 2016-2018 David M. Johnson
-- License     :  BSD3-style (see the file LICENSE)
-- Maintainer  :  David M. Johnson <djohnson.m@gmail.com>
-- Stability   :  experimental
-- Portability :  non-portable
----------------------------------------------------------------------------
module Miso.Html.Element
  ( -- * Construct an Element
      nodeHtml
    , nodeHtmlKeyed
    -- * Headers
    , h1_
    , h2_
    , h3_
    , h4_
    , h5_
    , h6_
    -- * Grouping Content
    , div_
    , p_
    , hr_
    , pre_
    , blockquote_
    -- * Text
    , code_
    , em_
    , span_
    , a_
    , strong_
    , i_
    , b_
    , u_
    , sub_
    , sup_
    , br_
    -- * Lists
    , ol_
    , ul_
    , li_
    , liKeyed_
    , dl_
    , dt_
    , dd_
    -- * Embedded Content
    , img_
    , iframe_
    , canvas_
    , math_
    , script_
    , link_
    , Miso.Html.Element.style_
    -- * Inputs
    , select_
    , option_
    , textarea_
    , form_
    , input_
    , button_
    -- * Sections
    , section_
    , header_
    , footer_
    , nav_
    , article_
    , aside_
    , address_
    , main_
    , body_
    -- * Figures
    , figure_
    , figcaption_
    -- * Tables
    , table_
    , caption_
    , colgroup_
    , col_
    , tbody_
    , thead_
    , tfoot_
    , tr_
    , trKeyed_
    , td_
    , th_
    -- * Less common elements
    , label_
    , fieldset_
    , legend_
    , datalist_
    , optgroup_
    , keygen_
    , output_
    , progress_
    , meter_
    , center_
    -- * Audio and Video
    , audio_
    , video_
    , source_
    , track_
    -- * Embedded objects
    , embed_
    , object_
    , param_
    -- * Text edits
    , ins_
    , del_
    -- * Semantic text
    , small_
    , cite_
    , dfn_
    , abbr_
    , time_
    , var_
    , samp_
    , kbd_
    , q_
    , s_
    -- * Less common tags
    , mark_
    , ruby_
    , rt_
    , rp_
    , bdi_
    , bdo_
    , wbr_
    -- * Interactive elements
    , details_
    , summary_
    , menuitem_
    , menu_
    ) where

import           Miso.Html.Types
import           Miso.String (MisoString)

-- | Used to construct `VNode`'s in `View`
nodeHtml :: MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml :: MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml = (MisoString
 -> Maybe Key -> [Attribute action] -> [View action] -> View action)
-> Maybe Key
-> MisoString
-> [Attribute action]
-> [View action]
-> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML) Maybe Key
forall a. Maybe a
Nothing

-- | Construct a node with a `Key`
nodeHtmlKeyed :: MisoString -> Key -> [Attribute action] -> [View action] -> View action
nodeHtmlKeyed :: MisoString
-> Key -> [Attribute action] -> [View action] -> View action
nodeHtmlKeyed MisoString
name = NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML MisoString
name (Maybe Key -> [Attribute action] -> [View action] -> View action)
-> (Key -> Maybe Key)
-> Key
-> [Attribute action]
-> [View action]
-> View action
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Key -> Maybe Key
forall (f :: * -> *) a. Applicative f => a -> f a
pure

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/div
div_ :: [Attribute action] -> [View action] -> View action
div_ :: [Attribute action] -> [View action] -> View action
div_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"div"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/table
table_ :: [Attribute action] -> [View action] -> View action
table_ :: [Attribute action] -> [View action] -> View action
table_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"table"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/thead
thead_ :: [Attribute action] -> [View action] -> View action
thead_ :: [Attribute action] -> [View action] -> View action
thead_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"thead"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/tbody
tbody_ :: [Attribute action] -> [View action] -> View action
tbody_ :: [Attribute action] -> [View action] -> View action
tbody_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"tbody"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/tr
tr_ :: [Attribute action] -> [View action] -> View action
tr_ :: [Attribute action] -> [View action] -> View action
tr_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"tr"

-- | Contains `Key`, inteded to be used for child replacement patch
--
-- <https://developer.mozilla.org/en-US/docs/Web/HTML/Element/tr>

trKeyed_ :: Key -> [Attribute action] -> [View action] -> View action
trKeyed_ :: Key -> [Attribute action] -> [View action] -> View action
trKeyed_ = NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML MisoString
"tr" (Maybe Key -> [Attribute action] -> [View action] -> View action)
-> (Key -> Maybe Key)
-> Key
-> [Attribute action]
-> [View action]
-> View action
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Key -> Maybe Key
forall (f :: * -> *) a. Applicative f => a -> f a
pure

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/th
th_ :: [Attribute action] -> [View action] -> View action
th_ :: [Attribute action] -> [View action] -> View action
th_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"th"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/td
td_ :: [Attribute action] -> [View action] -> View action
td_ :: [Attribute action] -> [View action] -> View action
td_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"td"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/tfoot
tfoot_ :: [Attribute action] -> [View action] -> View action
tfoot_ :: [Attribute action] -> [View action] -> View action
tfoot_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"tfoot"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/section
section_ :: [Attribute action] -> [View action] -> View action
section_ :: [Attribute action] -> [View action] -> View action
section_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"section"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/header
header_ :: [Attribute action] -> [View action] -> View action
header_ :: [Attribute action] -> [View action] -> View action
header_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"header"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/footer
footer_ :: [Attribute action] -> [View action] -> View action
footer_ :: [Attribute action] -> [View action] -> View action
footer_  = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"footer"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/button
button_ :: [Attribute action] -> [View action] -> View action
button_ :: [Attribute action] -> [View action] -> View action
button_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"button"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/form
form_ :: [Attribute action] -> [View action] -> View action
form_ :: [Attribute action] -> [View action] -> View action
form_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"form"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/p
p_ :: [Attribute action] -> [View action] -> View action
p_ :: [Attribute action] -> [View action] -> View action
p_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"p"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/s
s_ :: [Attribute action] -> [View action] -> View action
s_ :: [Attribute action] -> [View action] -> View action
s_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"s"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/ul
ul_ :: [Attribute action] -> [View action] -> View action
ul_ :: [Attribute action] -> [View action] -> View action
ul_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"ul"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/span
span_ :: [Attribute action] -> [View action] -> View action
span_ :: [Attribute action] -> [View action] -> View action
span_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"span"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/strong
strong_ :: [Attribute action] -> [View action] -> View action
strong_ :: [Attribute action] -> [View action] -> View action
strong_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"strong"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/li
li_ :: [Attribute action] -> [View action] -> View action
li_ :: [Attribute action] -> [View action] -> View action
li_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"li"

-- | Contains `Key`, inteded to be used for child replacement patch
--
-- <https://developer.mozilla.org/en-US/docs/Web/HTML/Element/li>
--
liKeyed_ :: Key -> [Attribute action] -> [View action] -> View action
liKeyed_ :: Key -> [Attribute action] -> [View action] -> View action
liKeyed_ = NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML MisoString
"li" (Maybe Key -> [Attribute action] -> [View action] -> View action)
-> (Key -> Maybe Key)
-> Key
-> [Attribute action]
-> [View action]
-> View action
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Key -> Maybe Key
forall (f :: * -> *) a. Applicative f => a -> f a
pure

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h1
h1_ :: [Attribute action] -> [View action] -> View action
h1_ :: [Attribute action] -> [View action] -> View action
h1_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h1"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h2
h2_ :: [Attribute action] -> [View action] -> View action
h2_ :: [Attribute action] -> [View action] -> View action
h2_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h2"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h3
h3_ :: [Attribute action] -> [View action] -> View action
h3_ :: [Attribute action] -> [View action] -> View action
h3_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h3"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h4
h4_ :: [Attribute action] -> [View action] -> View action
h4_ :: [Attribute action] -> [View action] -> View action
h4_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h4"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h5
h5_ :: [Attribute action] -> [View action] -> View action
h5_ :: [Attribute action] -> [View action] -> View action
h5_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h5"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/h6
h6_ :: [Attribute action] -> [View action] -> View action
h6_ :: [Attribute action] -> [View action] -> View action
h6_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"h6"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/hr
hr_ :: [Attribute action] -> View action
hr_ :: [Attribute action] -> View action
hr_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"hr") []

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/pre
pre_ :: [Attribute action] -> [View action] -> View action
pre_ :: [Attribute action] -> [View action] -> View action
pre_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"pre"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/input
input_ :: [Attribute action] -> View action
input_ :: [Attribute action] -> View action
input_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"input") []

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/label
label_ :: [Attribute action] -> [View action] -> View action
label_ :: [Attribute action] -> [View action] -> View action
label_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"label"

-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/a
a_ :: [Attribute action] -> [View action] -> View action
a_ :: [Attribute action] -> [View action] -> View action
a_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"a"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/mark
mark_ :: [Attribute action] -> [View action] -> View action
mark_ :: [Attribute action] -> [View action] -> View action
mark_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"mark"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/ruby
ruby_ :: [Attribute action] -> [View action] -> View action
ruby_ :: [Attribute action] -> [View action] -> View action
ruby_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"ruby"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/rt
rt_ :: [Attribute action] -> [View action] -> View action
rt_ :: [Attribute action] -> [View action] -> View action
rt_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"rt"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/rp
rp_ :: [Attribute action] -> [View action] -> View action
rp_ :: [Attribute action] -> [View action] -> View action
rp_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"rp"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/bdi
bdi_ :: [Attribute action] -> [View action] -> View action
bdi_ :: [Attribute action] -> [View action] -> View action
bdi_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"bdi"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/bdo
bdo_ :: [Attribute action] -> [View action] -> View action
bdo_ :: [Attribute action] -> [View action] -> View action
bdo_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"bdo"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/wbr
wbr_ :: [Attribute action] -> View action
wbr_ :: [Attribute action] -> View action
wbr_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"wbr") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/details
details_ :: [Attribute action] -> [View action] -> View action
details_ :: [Attribute action] -> [View action] -> View action
details_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"details"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/summary
summary_ :: [Attribute action] -> [View action] -> View action
summary_ :: [Attribute action] -> [View action] -> View action
summary_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"summary"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/menuitem
menuitem_ :: [Attribute action] -> [View action] -> View action
menuitem_ :: [Attribute action] -> [View action] -> View action
menuitem_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"menuitem"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/menu
menu_ :: [Attribute action] -> [View action] -> View action
menu_ :: [Attribute action] -> [View action] -> View action
menu_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"menu"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/fieldset
fieldset_ :: [Attribute action] -> [View action] -> View action
fieldset_ :: [Attribute action] -> [View action] -> View action
fieldset_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"fieldset"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/legend
legend_ :: [Attribute action] -> [View action] -> View action
legend_ :: [Attribute action] -> [View action] -> View action
legend_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"legend"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/datalist
datalist_ :: [Attribute action] -> [View action] -> View action
datalist_ :: [Attribute action] -> [View action] -> View action
datalist_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"datalist"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/optgroup
optgroup_ :: [Attribute action] -> [View action] -> View action
optgroup_ :: [Attribute action] -> [View action] -> View action
optgroup_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"optgroup"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/keygen
keygen_ :: [Attribute action] -> [View action] -> View action
keygen_ :: [Attribute action] -> [View action] -> View action
keygen_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"keygen"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/output
output_ :: [Attribute action] -> [View action] -> View action
output_ :: [Attribute action] -> [View action] -> View action
output_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"output"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/progress
progress_ :: [Attribute action] -> [View action] -> View action
progress_ :: [Attribute action] -> [View action] -> View action
progress_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"progress"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/meter
meter_ :: [Attribute action] -> [View action] -> View action
meter_ :: [Attribute action] -> [View action] -> View action
meter_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"meter"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/center
center_ :: [Attribute action] -> [View action] -> View action
center_ :: [Attribute action] -> [View action] -> View action
center_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"center"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/audio
audio_ :: [Attribute action] -> [View action] -> View action
audio_ :: [Attribute action] -> [View action] -> View action
audio_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"audio"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/video
video_ :: [Attribute action] -> [View action] -> View action
video_ :: [Attribute action] -> [View action] -> View action
video_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"video"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/source
source_ :: [Attribute action] -> View action
source_ :: [Attribute action] -> View action
source_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"source") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/track
track_ :: [Attribute action] -> View action
track_ :: [Attribute action] -> View action
track_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"track") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/embed
embed_ :: [Attribute action] -> View action
embed_ :: [Attribute action] -> View action
embed_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"embed") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/object
object_ :: [Attribute action] -> [View action] -> View action
object_ :: [Attribute action] -> [View action] -> View action
object_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"object"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/param
param_ :: [Attribute action] -> View action
param_ :: [Attribute action] -> View action
param_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"param") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/ins
ins_ :: [Attribute action] -> [View action] -> View action
ins_ :: [Attribute action] -> [View action] -> View action
ins_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"ins"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/del
del_ :: [Attribute action] -> [View action] -> View action
del_ :: [Attribute action] -> [View action] -> View action
del_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"del"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/small
small_ :: [Attribute action] -> [View action] -> View action
small_ :: [Attribute action] -> [View action] -> View action
small_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"small"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/cite
cite_ :: [Attribute action] -> [View action] -> View action
cite_ :: [Attribute action] -> [View action] -> View action
cite_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"cite"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/dfn
dfn_ :: [Attribute action] -> [View action] -> View action
dfn_ :: [Attribute action] -> [View action] -> View action
dfn_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"dfn"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/abbr
abbr_ :: [Attribute action] -> [View action] -> View action
abbr_ :: [Attribute action] -> [View action] -> View action
abbr_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"abbr"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/time
time_ :: [Attribute action] -> [View action] -> View action
time_ :: [Attribute action] -> [View action] -> View action
time_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"time"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/var
var_ :: [Attribute action] -> [View action] -> View action
var_ :: [Attribute action] -> [View action] -> View action
var_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"var"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/samp
samp_ :: [Attribute action] -> [View action] -> View action
samp_ :: [Attribute action] -> [View action] -> View action
samp_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"samp"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/kbd
kbd_ :: [Attribute action] -> [View action] -> View action
kbd_ :: [Attribute action] -> [View action] -> View action
kbd_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"kbd"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/caption
caption_ :: [Attribute action] -> [View action] -> View action
caption_ :: [Attribute action] -> [View action] -> View action
caption_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"caption"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/colgroup
colgroup_ :: [Attribute action] -> [View action] -> View action
colgroup_ :: [Attribute action] -> [View action] -> View action
colgroup_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"colgroup"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/col
col_ :: [Attribute action] -> View action
col_ :: [Attribute action] -> View action
col_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"col") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/nav
nav_ :: [Attribute action] -> [View action] -> View action
nav_ :: [Attribute action] -> [View action] -> View action
nav_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"nav"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/article
article_ :: [Attribute action] -> [View action] -> View action
article_ :: [Attribute action] -> [View action] -> View action
article_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"article"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/aside
aside_ :: [Attribute action] -> [View action] -> View action
aside_ :: [Attribute action] -> [View action] -> View action
aside_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"aside"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/address
address_ :: [Attribute action] -> [View action] -> View action
address_ :: [Attribute action] -> [View action] -> View action
address_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"address"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/main
main_ :: [Attribute action] -> [View action] -> View action
main_ :: [Attribute action] -> [View action] -> View action
main_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"main"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/body
body_ :: [Attribute action] -> [View action] -> View action
body_ :: [Attribute action] -> [View action] -> View action
body_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"body"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/figure
figure_ :: [Attribute action] -> [View action] -> View action
figure_ :: [Attribute action] -> [View action] -> View action
figure_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"figure"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/figcaption
figcaption_ :: [Attribute action] -> [View action] -> View action
figcaption_ :: [Attribute action] -> [View action] -> View action
figcaption_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"figcaption"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/dl
dl_ :: [Attribute action] -> [View action] -> View action
dl_ :: [Attribute action] -> [View action] -> View action
dl_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"dl"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/dt
dt_ :: [Attribute action] -> [View action] -> View action
dt_ :: [Attribute action] -> [View action] -> View action
dt_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"dt"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/dd
dd_ :: [Attribute action] -> [View action] -> View action
dd_ :: [Attribute action] -> [View action] -> View action
dd_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"dd"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/img
img_ :: [Attribute action] -> View action
img_ :: [Attribute action] -> View action
img_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"img") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/iframe
iframe_ :: [Attribute action] -> [View action] -> View action
iframe_ :: [Attribute action] -> [View action] -> View action
iframe_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"iframe"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/canvas
canvas_ :: [Attribute action] -> [View action] -> View action
canvas_ :: [Attribute action] -> [View action] -> View action
canvas_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"canvas"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/math
math_ :: [Attribute action] -> [View action] -> View action
math_ :: [Attribute action] -> [View action] -> View action
math_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"math"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/select
select_ :: [Attribute action] -> [View action] -> View action
select_ :: [Attribute action] -> [View action] -> View action
select_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"select"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/option
option_ :: [Attribute action] -> [View action] -> View action
option_ :: [Attribute action] -> [View action] -> View action
option_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"option"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/textarea
textarea_ :: [Attribute action] -> [View action] -> View action
textarea_ :: [Attribute action] -> [View action] -> View action
textarea_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"textarea"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/sub
sub_ :: [Attribute action] -> [View action] -> View action
sub_ :: [Attribute action] -> [View action] -> View action
sub_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"sub"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/sup
sup_ :: [Attribute action] -> [View action] -> View action
sup_ :: [Attribute action] -> [View action] -> View action
sup_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"sup"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/br
br_ :: [Attribute action] -> View action
br_ :: [Attribute action] -> View action
br_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"br") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/ol
ol_ :: [Attribute action] -> [View action] -> View action
ol_ :: [Attribute action] -> [View action] -> View action
ol_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"ol"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/blockquote
blockquote_ :: [Attribute action] -> [View action] -> View action
blockquote_ :: [Attribute action] -> [View action] -> View action
blockquote_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"blockquote"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/code
code_ :: [Attribute action] -> [View action] -> View action
code_ :: [Attribute action] -> [View action] -> View action
code_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"code"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/em
em_ :: [Attribute action] -> [View action] -> View action
em_ :: [Attribute action] -> [View action] -> View action
em_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"em"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/i
i_ :: [Attribute action] -> [View action] -> View action
i_ :: [Attribute action] -> [View action] -> View action
i_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"i"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/b
b_ :: [Attribute action] -> [View action] -> View action
b_ :: [Attribute action] -> [View action] -> View action
b_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"b"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/u
u_ :: [Attribute action] -> [View action] -> View action
u_ :: [Attribute action] -> [View action] -> View action
u_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"u"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/q
q_ :: [Attribute action] -> [View action] -> View action
q_ :: [Attribute action] -> [View action] -> View action
q_ = MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"q"
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/link
link_ :: [Attribute action] -> View action
link_ :: [Attribute action] -> View action
link_ = ([Attribute action] -> [View action] -> View action)
-> [View action] -> [Attribute action] -> View action
forall a b c. (a -> b -> c) -> b -> a -> c
flip (MisoString -> [Attribute action] -> [View action] -> View action
forall action.
MisoString -> [Attribute action] -> [View action] -> View action
nodeHtml MisoString
"link") []
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/style
--
-- This takes the raw text to be put in the style tag.
--
-- That means that if any part of the text is not trusted there's
-- a potential CSS injection. Read more at
-- https://owasp.org/www-project-web-security-testing-guide/latest/4-Web_Application_Security_Testing/11-Client_Side_Testing/05-Testing_for_CSS_Injection
--
-- You can also easily shoot yourself in the foot with something like:
--
-- @'style_' [] "\</style\>"@
style_ :: [Attribute action] -> MisoString -> View action
style_ :: [Attribute action] -> MisoString -> View action
style_ [Attribute action]
attrs MisoString
rawText = NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML MisoString
"style" Maybe Key
forall a. Maybe a
Nothing [Attribute action]
attrs [MisoString -> View action
forall action. MisoString -> View action
textRaw MisoString
rawText]
-- | https://developer.mozilla.org/en-US/docs/Web/HTML/Element/script
--
-- This takes the raw text to be put in the script tag.
--
-- That means that if any part of the text is not trusted there's
-- a potential JavaScript injection. Read more at
-- https://owasp.org/www-community/attacks/xss/
--
-- You can also easily shoot yourself in the foot with something like:
--
-- @'script_' [] "\</script\>"@
script_ :: [Attribute action] -> MisoString -> View action
script_ :: [Attribute action] -> MisoString -> View action
script_ [Attribute action]
attrs MisoString
rawText = NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
forall action.
NS
-> MisoString
-> Maybe Key
-> [Attribute action]
-> [View action]
-> View action
node NS
HTML MisoString
"script" Maybe Key
forall a. Maybe a
Nothing [Attribute action]
attrs [MisoString -> View action
forall action. MisoString -> View action
textRaw MisoString
rawText]