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

Add a test for d3af9807 (#5682)


Signed-off-by: default avatarAustin Seipp <austin@well-typed.com>

(cherry picked from commit 5a576754)
parent ff57204d
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE DataKinds, DeriveDataTypeable, StandaloneDeriving, TypeOperators #-}
{-# LANGUAGE DataKinds, PolyKinds, DeriveDataTypeable, StandaloneDeriving, TypeOperators #-}
module T5682 where
......@@ -9,4 +9,5 @@ data Foo = Bool :+: Bool
type X = True ':+: False
deriving instance Typeable '(:+:)
\ No newline at end of file
deriving instance Typeable '(:+:)
deriving instance Typeable '(,,)
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