Skip to content

Commit

Permalink
Add test for T7704
Browse files Browse the repository at this point in the history
  • Loading branch information
dreixel committed Mar 8, 2013
1 parent 63176fa commit be2ffc3
Show file tree
Hide file tree
Showing 2 changed files with 28 additions and 0 deletions.
27 changes: 27 additions & 0 deletions tests/deriving/should_compile/T7704.hs
@@ -0,0 +1,27 @@
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE StandaloneDeriving #-}

module T7704 where

import Data.Typeable

data A1 = A1 deriving Typeable
data A2 = A2
deriving instance Typeable A2

data B1 a = B1 deriving Typeable
data B2 a = B2
deriving instance Typeable B2

data C1 a = C1 deriving Typeable
data C2 a = C2
deriving instance Typeable C2

data D1 f = D1 (f (D1 f)) deriving Typeable
data D2 f = D2 (f (D2 f))
deriving instance Typeable D2

data E1 (a :: k) f = E1 (f Int) deriving Typeable
data E2 (a :: k) f = E2 (f Int)
deriving instance Typeable E2
1 change: 1 addition & 0 deletions tests/deriving/should_compile/all.T
Expand Up @@ -36,4 +36,5 @@ test('T1133',
extra_clean(['T1133.o-boot', 'T1133.hi-boot']),
run_command,
['$MAKE --no-print-directory -s T1133'])
test('T7704', normal, compile, [''])
test('T7710', normal, compile, [''])

0 comments on commit be2ffc3

Please sign in to comment.