
#14790: eqTypeRep does not inline -------------------------------------+------------------------------------- Reporter: dfeuer | Owner: (none) Type: bug | Status: new Priority: normal | Milestone: 8.6.1 Component: Compiler | Version: 8.4.1-alpha2 Resolution: | Keywords: Operating System: Unknown/Multiple | Architecture: Type of failure: Runtime | Unknown/Multiple performance bug | Test Case: Blocked By: | Blocking: Related Tickets: | Differential Rev(s): Wiki Page: | -------------------------------------+------------------------------------- Description changed by dfeuer: Old description:
GHC never seems to inline `eqTypeRep`. That's no good! It produces a `Maybe`, which users will almost certainly want to match on immediately.
I really don't understand ''why'' it doesn't inline. It's a tiny function, none of the functions it calls are themselves marked `INLINE`, and the advantage to inlining seems obvious. Does the `unsafeCoerce` get in the way somehow? If so, how can we fix it?
Example:
{{{#!hs {-# language GADTs, ScopedTypeVariables, TypeApplications, AllowAmbiguousTypes #-} module Foo where import Type.Reflection
foo :: forall a. Typeable a => Bool foo = case eqTypeRep (typeRep @a) (typeRep @Int) of Just _ -> True Nothing -> False }}}
compiles (with `-O2`) to
{{{ foo [InlPrag=NOINLINE] :: forall a. Typeable a => Bool [GblId, Arity=1, Str=
] foo = \ (@ a_a5un) ($dTypeable_a5up :: Typeable a_a5un) -> case eqTypeRep @ * @ * @ a_a5un @ Int ($dTypeable_a5up `cast` (base-4.10.1.0:Data.Typeable.Internal.N:Typeable[0] <*>_N_N :: (Typeable a_a5un :: Constraint) ~R# (TypeRep a_a5un :: *))) lvl4_r69g of { Nothing -> GHC.Types.False; Just ds_d5CQ -> GHC.Types.True } }}}
New description:
GHC never seems to inline `eqTypeRep`. That's no good! It produces a
`Maybe`, which users will almost certainly want to match on immediately.
I really don't understand ''why'' it doesn't inline. It's a tiny function,
none of the functions it calls are themselves marked `INLINE`, and the
advantage to inlining seems obvious. Does the `unsafeCoerce` get in the
way somehow? If so, how can we fix it?
Example:
{{{#!hs
{-# language GADTs, ScopedTypeVariables, TypeApplications,
AllowAmbiguousTypes #-}
module Foo where
import Type.Reflection
foo :: forall a. Typeable a => Bool
foo = case eqTypeRep (typeRep @a) (typeRep @Int) of
Just _ -> True
Nothing -> False
}}}
compiles (with `-O2`) to
{{{
foo [InlPrag=NOINLINE] :: forall a. Typeable a => Bool
[GblId, Arity=1, Str=]
foo
= \ (@ a_a5un) ($dTypeable_a5up :: Typeable a_a5un) ->
case eqTypeRep
@ *
@ *
@ a_a5un
@ Int
($dTypeable_a5up
`cast` (base-4.10.1.0:Data.Typeable.Internal.N:Typeable[0]
<*>_N