module Text.HTML.Moe.DSL.Kawaii where


import Text.HTML.Moe
import Text.HTML.Moe.Type (MoeUnit)
import Prelude hiding ((-), (/), div)

c :: String -> MoeUnit -> MoeUnit
c x = div [_class x]

css :: String -> MoeUnit
css x = link [rel "stylesheet", _type "text/css", href x] (/)