{-# LANGUAGE NoImplicitPrelude #-}

module Blizzard.Html.Attributes
    ( module Text.Blaze.Html5.Attributes
    , css
    ) where


import Data.Text (Text, unwords)
import Prelude ((.))
import Text.Blaze.Html5 (Attribute, textValue)
import Text.Blaze.Html5.Attributes


css :: [Text] -> Attribute
css :: [Text] -> Attribute
css = AttributeValue -> Attribute
class_ (AttributeValue -> Attribute)
-> ([Text] -> AttributeValue) -> [Text] -> Attribute
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> AttributeValue
textValue (Text -> AttributeValue)
-> ([Text] -> Text) -> [Text] -> AttributeValue
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Text] -> Text
unwords