{-# LANGUAGE TypeApplications #-} {-# LANGUAGE FlexibleContexts #-} {-# LANGUAGE TypeOperators #-} {-# LANGUAGE DataKinds #-} module Main where import Html import qualified Html.Attribute as A import Data.Proxy import Test.Hspec import Test.QuickCheck main :: IO () main = hspec spec spec :: Spec spec = parallel $ do describe "render" $ do it "is id on strings without escaping" $ do property $ \x -> renderString (Raw x) === x it "handles single elements" $ do property $ \x -> renderString (div_ (Raw x)) === "