Skip to content
Snippets Groups Projects
Commit 89465bc6 authored by Austin Seipp's avatar Austin Seipp Committed by thoughtpolice
Browse files

Add missed test (uuugh)


Signed-off-by: default avatarAustin Seipp <austin@well-typed.com>
(cherry picked from commit 34ba68c2)
parent 6f46fe15
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE AutoDeriveTypeable, PolyKinds, TypeFamilies, StandaloneDeriving #-}
module T9999 where
import Data.Typeable
data family F a
class C a where
data F1 a
type F2 a
main = typeRep (Proxy :: Proxy F) == typeRep (Proxy :: Proxy F1)
T9999.hs:13:38:
No instance for (Typeable F1)
(maybe you haven't applied enough arguments to a function?)
arising from a use of ‘typeRep’
In the second argument of ‘(==)’, namely
‘typeRep (Proxy :: Proxy F1)’
In the expression:
typeRep (Proxy :: Proxy F) == typeRep (Proxy :: Proxy F1)
In an equation for ‘main’:
main = typeRep (Proxy :: Proxy F) == typeRep (Proxy :: Proxy F1)
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