Skip to content
Snippets Groups Projects
Commit 7ef9f22b authored by David Terei's avatar David Terei
Browse files

Fix some more race issues with safe tests.

parent 8af2f36d
No related merge requests found
......@@ -2,7 +2,7 @@
{-# LANGUAGE TemplateHaskell #-}
module Main where
import SafeLang11_A
import SafeLang12_A
import SafeLang12_B
$(mkSimpleClass ''A)
......
......@@ -4,8 +4,7 @@ SafeLang12.hs:2:14:
SafeLang12_B.hs:2:14:
Warning: XTemplateHaskell is not allowed in Safe Haskell; ignoring XTemplateHaskell
[1 of 3] Compiling SafeLang12_B ( SafeLang12_B.hs, SafeLang12_B.o )
SafeLang12_B.hs:3:8:
File name does not match module name:
Saw: `SafeLang11_B'
Expected: `SafeLang12_B'
SafeLang12_B.hs:14:68:
lexical error in string/character literal at character '\''
{-# LANGUAGE Safe #-}
module SafeLang12_A ( A ) where
data A = A1 | A2
instance Show A where
show A1 = "A1 is secret!"
show A2 = "A2 is secret!"
{-# LANGUAGE Safe #-}
{-# LANGUAGE TemplateHaskell #-}
module SafeLang11_B ( Class(..), mkSimpleClass ) where
module SafeLang12_B ( Class(..), mkSimpleClass ) where
import Language.Haskell.TH
......
......@@ -4,7 +4,7 @@
-- should disallow. SafeLang14 will do that.
module Main where
import SafeLang13_A
import SafeLang14_A
import Data.Typeable
data H = H String deriving (Typeable, Show)
......
[1 of 2] Compiling SafeLang13_A ( SafeLang13_A.hs, SafeLang13_A.o )
[1 of 2] Compiling SafeLang14_A ( SafeLang14_A.hs, SafeLang14_A.o )
[2 of 2] Compiling Main ( SafeLang14.hs, SafeLang14.o )
SafeLang14.hs:14:10:
......
module SafeLang13_A (IsoInt, h, showH, P, p, showP) where
module SafeLang14_A (IsoInt, h, showH, P, p, showP) where
newtype IsoInt = I Int
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment