Add test suite for Yesod.Internal.Request.
This commit is contained in:
parent
817ab988e0
commit
b83029dc36
@ -1,9 +1,14 @@
|
||||
{-# LANGUAGE OverloadedStrings #-}
|
||||
{-# LANGUAGE CPP #-}
|
||||
module Yesod.Internal.Request
|
||||
( parseWaiRequest
|
||||
, Request (..)
|
||||
, RequestBodyContents
|
||||
, FileInfo (..)
|
||||
#ifdef TEST
|
||||
, randomString
|
||||
, parseWaiRequest'
|
||||
#endif
|
||||
) where
|
||||
|
||||
import Control.Applicative ((<$>))
|
||||
|
||||
89
yesod-core/test/Test/InternalRequest.hs
Normal file
89
yesod-core/test/Test/InternalRequest.hs
Normal file
@ -0,0 +1,89 @@
|
||||
{-# LANGUAGE OverloadedStrings #-}
|
||||
module Test.InternalRequest where
|
||||
|
||||
import Data.List (nub)
|
||||
import System.Random (StdGen, mkStdGen)
|
||||
import Control.Applicative ((<$>))
|
||||
|
||||
import Blaze.ByteString.Builder
|
||||
|
||||
import Yesod.Internal.Request
|
||||
import Network.Wai as W
|
||||
import Network.Wai.Test
|
||||
import Web.Cookie (renderCookies)
|
||||
import Test.Hspec
|
||||
import Test.Hspec.HUnit
|
||||
|
||||
|
||||
randomStringSpecs :: [Spec]
|
||||
randomStringSpecs = describe "Yesod.Internal.Request.randomString"
|
||||
[ it "does not repeat itself" $ noRepeat 10 100
|
||||
]
|
||||
|
||||
noRepeat len n = length (nub $ map (randomString len . mkStdGen) [1..n]) == n
|
||||
|
||||
|
||||
-- For convenience instead of "(undefined :: StdGen)".
|
||||
g :: StdGen
|
||||
g = undefined
|
||||
|
||||
|
||||
nonceSpecs :: [Spec]
|
||||
nonceSpecs = describe "Yesod.Internal.Request.parseWaiRequest (reqNonce)"
|
||||
[ it "is Nothing for unsecure sessions" noUnsecureNonce
|
||||
, it "ignores pre-existing nonce for unsecure sessions" ignoreUnsecureNonce
|
||||
, it "uses preexisting nonce for secure sessions" useOldNonce
|
||||
, it "generates a new nonce for secure sessions without nonce" generateNonce
|
||||
]
|
||||
|
||||
noUnsecureNonce = reqNonce r == Nothing where
|
||||
r = parseWaiRequest' defaultRequest [] Nothing g
|
||||
|
||||
ignoreUnsecureNonce = reqNonce r == Nothing where
|
||||
r = parseWaiRequest' defaultRequest [("_NONCE", "old")] Nothing g
|
||||
|
||||
useOldNonce = reqNonce r == Just "old" where
|
||||
r = parseWaiRequest' defaultRequest [("_NONCE", "old")] (Just undefined) g
|
||||
|
||||
generateNonce = reqNonce r /= Nothing where
|
||||
r = parseWaiRequest' defaultRequest [("_NONCE", "old")] (Just undefined) g
|
||||
|
||||
|
||||
langSpecs :: [Spec]
|
||||
langSpecs = describe "Yesod.Internal.Request.parseWaiRequest (reqLangs)"
|
||||
[ it "respects Accept-Language" respectAcceptLang
|
||||
, it "respects sessions" respectSessionLang
|
||||
, it "respects cookies" respectCookieLang
|
||||
, it "respects queries" respectQueryLang
|
||||
, it "prioritizes correctly" prioritizeLangs
|
||||
]
|
||||
|
||||
respectAcceptLang = reqLangs r == ["accept1", "accept2"] where
|
||||
r = parseWaiRequest' defaultRequest
|
||||
{ requestHeaders = [("Accept-Language", "accept1, accept2")] } [] Nothing g
|
||||
|
||||
respectSessionLang = reqLangs r == ["session"] where
|
||||
r = parseWaiRequest' defaultRequest [("_LANG", "session")] Nothing g
|
||||
|
||||
respectCookieLang = reqLangs r == ["cookie"] where
|
||||
r = parseWaiRequest' defaultRequest
|
||||
{ requestHeaders = [("Cookie", toByteString $ renderCookies [("_LANG", "cookie")])]
|
||||
} [] Nothing g
|
||||
|
||||
respectQueryLang = reqLangs r == ["query"] where
|
||||
r = parseWaiRequest' defaultRequest { queryString = [("_LANG", Just "query")] } [] Nothing g
|
||||
|
||||
prioritizeLangs = reqLangs r == ["query", "cookie", "session", "accept1", "accept2"] where
|
||||
r = parseWaiRequest' defaultRequest
|
||||
{ requestHeaders = [ ("Accept-Language", "accept1, accept2")
|
||||
, ("Cookie", toByteString $ renderCookies [("_LANG", "cookie")])
|
||||
]
|
||||
, queryString = [("_LANG", Just "query")]
|
||||
} [("_LANG", "session")] Nothing g
|
||||
|
||||
|
||||
internalRequestTest :: [Spec]
|
||||
internalRequestTest = descriptions [ randomStringSpecs
|
||||
, nonceSpecs
|
||||
, langSpecs
|
||||
]
|
||||
Loading…
Reference in New Issue
Block a user