-- |
-- Module       : Web.Saferoute.Blaze
-- Description  : Support for blaze-html
-- Copyright    : 2014, Peter Harpending.
-- License      : BSD3
-- Maintainer   : Peter Harpending <pharpend2@gmail.com>
-- Stability    : experimental
-- Portability  : archlinux
--

module Web.Saferoute.Blaze where

import qualified Text.Blaze.Html5 as H
import           Web.Saferoute

getUrl :: Resource r => r -> H.AttributeValue
getUrl = H.toValue . getRoute