Skip to content
Snippets Groups Projects
Commit 2041b94e authored by Simon Peyton Jones's avatar Simon Peyton Jones
Browse files

Test Trac #8469

parent 324f9952
No related branches found
No related tags found
No related merge requests found
module T8469 where
import T8469a
:l T8469
:info Int
data Int = GHC.Types.I# GHC.Prim.Int# -- Defined in ‛GHC.Types’
instance Bounded Int -- Defined in ‛GHC.Enum’
instance Enum Int -- Defined in ‛GHC.Enum’
instance Eq Int -- Defined in ‛GHC.Classes’
instance Integral Int -- Defined in ‛GHC.Real’
instance Num Int -- Defined in ‛GHC.Num’
instance Ord Int -- Defined in ‛GHC.Classes’
instance Read Int -- Defined in ‛GHC.Read’
instance Real Int -- Defined in ‛GHC.Real’
instance Show Int -- Defined in ‛GHC.Show’
{-# LANGUAGE TypeFamilies #-}
module T8469a () where
type family F a
type instance F Int = Bool
......@@ -157,4 +157,4 @@ test('T8172', normal, ghci_script, ['T8172.script'])
test('T8215', normal, ghci_script, ['T8215.script'])
test('T8357', normal, ghci_script, ['T8357.script'])
test('T8383', normal, ghci_script, ['T8383.script'])
test('T8469', normal, ghci_script, ['T8469.script'])
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