Skip to content

Commit

Permalink
Catch an illegal pragma and fix a typo
Browse files Browse the repository at this point in the history
  • Loading branch information
ggreif committed Jun 26, 2013
1 parent 96bf7db commit 100c051
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions GHC/TypeLits.hs
Expand Up @@ -158,7 +158,7 @@ instance (SingI a, SingE (KindOf a)) => SingRep (a :: k)

-- The type of an unknown singletons of a given kind.
-- Note that the "type" parameter on this type is really
-- a *kind* parameter (this is simillar to the trick used in `SingE`).
-- a *kind* parameter (this is similar to the trick used in `SingE`).
data SomeSing :: KindIs k -> * where
SomeSing :: SingI (n::k) => proxy n -> SomeSing (kp :: KindIs k)

Expand Down Expand Up @@ -212,7 +212,7 @@ incoherentForgetSing x = withSingI x it LocalProxy
it :: SingI n => LocalProxy n -> SomeSing kp
it = SomeSing

{-# LANGUAGE NOINLINE withSingI #-}
{-# NOINLINE withSingI #-}
withSingI :: Sing n -> (SingI n => a) -> a
withSingI x = magicSingI x ((\f -> f) :: () -> ())

Expand Down

0 comments on commit 100c051

Please sign in to comment.