{-# LANGUAGE QuasiQuotes #-} module Hack.Contrib.Response where import Hack import Hack.Contrib.Utils import Hack.Contrib.Constants import MPSUTF8 import Prelude hiding ((.), (^), (>), (+)) import Data.Maybe redirect :: String -> Maybe Int -> Response -> Response redirect target code = set_status (code.fromMaybe 302) > set_header _Location target finish :: Response -> Response finish r | r.status.belongs_to [204, 304] = r .delete_header _ContentType .set_body "" | otherwise = r header :: String -> Response -> Maybe String header s r = r.headers.get s has_header :: String -> Response -> Bool has_header s r = r.header s .isJust set_header :: String -> String -> Response -> Response set_header k v r = r { headers = r.headers.put k v } delete_header :: String -> Response -> Response delete_header k r = r { headers = r.headers.reject (fst > is k) } set_content_type :: String -> Response -> Response set_content_type s r = r.set_header _ContentType s set_content_length :: Int -> Response -> Response set_content_length i r = r.set_header _ContentLength (i.show) set_body :: String -> Response -> Response set_body s r = r { body = s } set_status :: Int -> Response -> Response set_status i r = r { status = i } set_last_modified :: String -> Response -> Response set_last_modified s r = r.set_header _LastModified s