{-# LANGUAGE NoMonomorphismRestriction#-} {-# LANGUAGE NoImplicitPrelude #-} {-# LANGUAGE QuasiQuotes #-} module Hack.Utils where import Hack import Network.CGI hiding (Html) import Network.URI import Data.Default import Prelude hiding ((.), (^), (>)) import MPS import Control.Arrow ((>>>)) (>) = (>>>) infixl 8 > not_found x = return $ Response { status = 404 , headers = [("Content-Type", "text/plain")] , body = x } empty_app :: Application empty_app = return def