{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE NoImplicitPrelude #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  Miso.Mathml.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.Mathml.Element
  ( -- * Construct an Element
      nodeMathml
  ) where

import           Miso.Html.Types
import           Miso.String (MisoString)
import qualified Prelude            as P

-- | Used to construct `VNode`'s in `View`
nodeMathml :: MisoString -> [Attribute action] -> [View action] -> View action
nodeMathml :: MisoString -> [Attribute action] -> [View action] -> View action
nodeMathml = (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
P.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
MATHML) Maybe Key
forall a. Maybe a
P.Nothing