{-# LANGUAGE OverloadedStrings, ScopedTypeVariables #-}
module Tests.Regressions
(
tests
) where
import Control.Exception (SomeException, handle)
import System.IO
import Test.HUnit (assertBool, assertEqual, assertFailure)
import qualified Data.ByteString as B
import Data.ByteString.Char8 ()
import qualified Data.ByteString.Lazy as LB
import qualified Data.Text as T
import qualified Data.Text.Encoding as TE
import qualified Data.Text.IO as T
import qualified Data.Text.Lazy as LT
import qualified Data.Text.Lazy.Encoding as LE
import qualified Data.Text.Unsafe as T
import qualified Test.Framework as F
import qualified Test.Framework.Providers.HUnit as F
import Tests.Utils (withTempFile)
lazy_encode_crash :: IO ()
lazy_encode_crash = withTempFile $ \ _ h ->
LB.hPut h . LE.encodeUtf8 . LT.pack . replicate 100000 $ 'a'
hGetContents_crash :: IO ()
hGetContents_crash = withTempFile $ \ path h -> do
B.hPut h (B.pack [0x78, 0xc4 ,0x0a]) >> hClose h
h' <- openFile path ReadMode
hSetEncoding h' utf8
handle (\(_::SomeException) -> return ()) $
T.hGetContents h' >> assertFailure "T.hGetContents should crash"
replicate_crash :: IO ()
replicate_crash = handle (\(_::SomeException) -> return ()) $
T.replicate (2^power) "0123456789abcdef" `seq`
assertFailure "T.replicate should crash"
where
power | maxBound == (2147483647::Int) = 28
| otherwise = 60 :: Int
utf8_decode_unsafe :: IO ()
utf8_decode_unsafe = do
let t = TE.decodeUtf8With (\_ _ -> Just '\xdc00') "\x80"
assertBool "broken error recovery shouldn't break us" (t == "\xfffd")
mapAccumL_resize :: IO ()
mapAccumL_resize = do
let f a _ = (a, '\65536')
count = 5
val = T.mapAccumL f (0::Int) (T.replicate count "a")
assertEqual "mapAccumL should correctly fill buffers for two-word results"
(0, T.replicate count "\65536") val
assertEqual "mapAccumL should correctly size buffers for two-word results"
(count * 2) (T.lengthWord16 (snd val))
tests :: F.Test
tests = F.testGroup "Regressions"
[ F.testCase "hGetContents_crash" hGetContents_crash
, F.testCase "lazy_encode_crash" lazy_encode_crash
, F.testCase "mapAccumL_resize" mapAccumL_resize
, F.testCase "replicate_crash" replicate_crash
, F.testCase "utf8_decode_unsafe" utf8_decode_unsafe
]