
#11611: ghc panics -------------------------------------+------------------------------------- Reporter: Iceland_jack | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 8.1 Resolution: | Keywords: Operating System: Unknown/Multiple | Architecture: | Unknown/Multiple Type of failure: None/Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | Differential Rev(s): Wiki Page: | -------------------------------------+------------------------------------- Comment (by Iceland_jack): I have yet to upgrade my compiler. Can someone confirm that this is the same bug: {{{#!hs {-# LANGUAGE MultiParamTypeClasses, TypeOperators, PolyKinds, TypeInType, FunctionalDependencies, AllowAmbiguousTypes, FlexibleInstances, FlexibleContexts #-} import Data.Kind (Type) class ToMimeType k (a :: k) | a -> k where toMimeType :: String instance ToMimeType Type Int where toMimeType = "int" instance ToMimeType Type Float where toMimeType = "fl" instance (ToMimeType a x, ToMimeType [a] xs) => ToMimeType [u] (x:xs) where }}} Feel free to close the ticket if so -- Ticket URL: http://ghc.haskell.org/trac/ghc/ticket/11611#comment:2 GHC http://www.haskell.org/ghc/ The Glasgow Haskell Compiler