You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE FlexibleContexts #-}
modulePanicwhereimportGHC.TypeLitstypefamilyTypeTable (s::Symbol) ::kclass (KnownNat (Indext), t~TypeTable (Indext)) =>TypeabletwheretypeIndext::Symbol
Here's the result:
Panic.hs:12:18: error:ghc: panic! (the 'impossible' happened)
(GHC version 7.11.20151105 for x86_64-unknown-linux):
AThing evaluated unexpectedly tcTyVar Index
The issue is that I accidentally used KnownNat instead of KnownSymbol.
The text was updated successfully, but these errors were encountered:
Thanks for the report! My understanding is that this panic should happen only with type-incorrect code. It will be fixed, but if you ever see it, you know your code has a bug somewhere. (Not all that helpful, I know!)
The following short program caused a panic:
Here's the result:
The issue is that I accidentally used KnownNat instead of KnownSymbol.
The text was updated successfully, but these errors were encountered: