<div dir="auto">Simon has an idea for making it safer. I suspect it's only properly safe with the "forall s", but there may be a way to at least make it specialization-safe (if not conditionally coherence-safe) without that.</div><div class="gmail_extra"><br><div class="gmail_quote">On Jan 17, 2017 2:42 PM, "Edward Kmett" <<a href="mailto:ekmett@gmail.com">ekmett@gmail.com</a>> wrote:<br type="attribution"><blockquote class="gmail_quote" style="margin:0 0 0 .8ex;border-left:1px #ccc solid;padding-left:1ex"><div dir="ltr">That is the paper the reflection library API is based on. <div><br></div><div>However, doing it the way mentioned in that paper (after modifying it to work around changes with the inliner for modern GHC) is about 3 orders of magnitude slower. We keep it around in reflection as the 'slow' path for portability to non-GHC compilers, and because that variant can make a form of Typeable reflection which is needed for some Exception gimmicks folks use.</div><div><br></div><div>The current approach, and the sort of variant that David is pushing above, is basically free, as it costs a single unsafeCoerce. To make the reflection library work in a fully type-safe manner would take 1-3 additional wired ins that would consist of well-typed core. The stuff David is proposing above would be more general but less safe.</div><div><div><br></div><div>-Edward</div></div></div><div class="gmail_extra"><br><div class="gmail_quote">On Tue, Jan 17, 2017 at 10:45 AM, Simon Peyton Jones <span dir="ltr"><<a href="mailto:simonpj@microsoft.com" target="_blank">simonpj@microsoft.com</a>></span> wrote:<br><blockquote class="gmail_quote" style="margin:0 0 0 .8ex;border-left:1px #ccc solid;padding-left:1ex">





<div lang="EN-GB" link="blue" vlink="purple">
<div class="m_-9165023776007292584m_4007598627940039537WordSection1">
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">David says that this paper is relevant<u></u><u></u></span></p>
<p class="MsoNormal"><a href="http://okmij.org/ftp/Haskell/tr-15-04.pdf" target="_blank">http://okmij.org/ftp/Haskell/t<wbr>r-15-04.pdf</a><u></u><u></u></p>
<p class="MsoNormal"><u></u> <u></u></p>
<p class="MsoNormal">Simon<span style="font-family:"Calibri",sans-serif"><u></u><u></u></span></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif"><u></u> <u></u></span></p>
<div style="border:none;border-left:solid blue 1.5pt;padding:0cm 0cm 0cm 4.0pt">
<div>
<div style="border:none;border-top:solid #e1e1e1 1.0pt;padding:3.0pt 0cm 0cm 0cm">
<p class="MsoNormal"><b><span lang="EN-US" style="font-size:11.0pt;font-family:"Calibri",sans-serif">From:</span></b><span lang="EN-US" style="font-size:11.0pt;font-family:"Calibri",sans-serif"> David Feuer [mailto:<a href="mailto:david.feuer@gmail.com" target="_blank">david.feuer@gmail.com</a>]
<br>
<b>Sent:</b> 14 January 2017 00:50<br>
<b>To:</b> Simon Peyton Jones <<a href="mailto:simonpj@microsoft.com" target="_blank">simonpj@microsoft.com</a>><br>
<b>Cc:</b> ghc-devs <<a href="mailto:ghc-devs@haskell.org" target="_blank">ghc-devs@haskell.org</a>>; Edward Kmett <<a href="mailto:ekmett@gmail.com" target="_blank">ekmett@gmail.com</a>><br>
<b>Subject:</b> RE: Magical function to support reflection<u></u><u></u></span></p>
</div>
</div><div><div class="m_-9165023776007292584h5">
<p class="MsoNormal"><u></u> <u></u></p>
<div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
I need to look through a bit more of this, but explicit type application certainly can be avoided using Tagged. Once we get the necessary magic, libraries will be able to come up with whatever interfaces they like. My main concern about the generality of<u></u><u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<u></u> <u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<span style="font-family:"Arial",sans-serif">reify# :: forall r. (RC a => r) -> a -> r</span><u></u><u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<u></u> <u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<span style="font-family:"Arial",sans-serif">(as with the primop type Edward came up with) is that it lacks the `forall s` safety mechanism of the reflection library. Along with its key role in ensuring class coherence[*], that mechanism also makes it clear
 what specialization is and is not allowed to do with reified values. Again, I'm not sure it can mess up the simpler/more general form you and Edward propose, but it makes me nervous.</span><u></u><u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<u></u> <u></u></p>
</div>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<span style="font-family:"Arial",sans-serif">[*] Coherence: as long as an instance of Reifies S A exists for some concrete S::K, users can't incoherently write a polymorphic Reifies instance for s::K.</span><u></u><u></u></p>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
<u></u> <u></u></p>
<div>
<p class="MsoNormal" style="margin-right:0cm;margin-bottom:6.0pt;margin-left:0cm">
On Jan 13, 2017 7:33 PM, "Simon Peyton Jones" <<a href="mailto:simonpj@microsoft.com" target="_blank">simonpj@microsoft.com</a>> wrote:<u></u><u></u></p>
<blockquote style="border:none;border-left:solid #cccccc 1.0pt;padding:0cm 0cm 0cm 6.0pt;margin-left:4.8pt;margin-right:0cm">
<div>
<div>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">David, Edward</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">Here’s my take on this thread about reflection.   I’ll ignore Tagged and the ‘s’ parameter, and the proxy arguments, since they are
 incidental.</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">I can finally see a reasonable path; I think there’s a potential GHC proposal here.</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">Simon</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif"> </span><u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif">First thing</span></b><span style="font-family:"Calibri",sans-serif">: PLEASE let's give a Core rendering of whatever is proposed.
 If it's expressible in Core that's reassuring.  If it requires an extension to Core, that's a whole different thing.</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif"> </span><u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif">Second</span></b><span style="font-family:"Calibri",sans-serif">.  For any
<i>particular</i> class, I think it's easy to express reify in Core.  Example (in Core):</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">reifyTypeable :: (Typeable a => b) -> TypeRep a -> b<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">reifyTypable k = k |> co<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">where co is a coercion that witnesses</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  co :: (forall a b. Typeable a => b) ~ forall a b. (TypeRep a -> b)<u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif"> </span></b><u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif">Third. 
</span></b><span style="font-family:"Calibri",sans-serif">This does not depend, and should not depend, on the fact that single-method classes are represented with a newtype.  E.g. if we changed Typeable to be represented with a data type thus (in Core)</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">data Typeable a = MkTypeable (TypeRep a)<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">using data rather than newtype, then we could still write reifyTypable.</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">reifyTypeable :: (Typeable a => b) -> TypeRep a -> b<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">reifyTypable = /\ab. \(f :: Typeable a => b). \(r :: TypeRep a).<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">               f (MkTypeable r)<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">The efficiency of newtype is nice, but it’s not essential.</span><u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif"> </span></b><u></u><u></u></p>
<p class="MsoNormal"><b><span style="font-family:"Calibri",sans-serif">Fourth</span></b><span style="font-family:"Calibri",sans-serif">.   As you point out, reify# is far too polymorphic.
<b>Clearly you need reify# to be a class method!</b>  Something like this</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">class Reifiable a where<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  type RC a :: Constraint  -- Short for Reified Constraint<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  reify# :: forall r. (RC a => r) -> a -> r<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">Now (in Core at least) we can make instances</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">instance Reifiable (TypeRep a) where<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  type RC (TypeRep a) = Typeable a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  reify# k = k |> co  -- For a suitable co<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">Now, we can’t write those instances in Haskell, but we could make the ‘deriving’ mechanism deal with it, thus:</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">deriving instance Reifiable (Typeable a)<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">You can supply a ‘where’ part if you like, but if you don’t GHC will fill in the implementation for you.  It’ll check that Typeable
 is a single-method class; produce a suitable implementation (in Core, as above) for reify#, and a suitable instance for RC. Pretty simple.   Now the solver can use those instances.</span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif">There are lots of details</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:Symbol">·</span><span style="font-size:7.0pt">       
</span><span style="font-family:"Calibri",sans-serif">I’ve used a single parameter class and a type function, because the call site of reify# will provide no information about the ‘c’ in (c => r) argument.</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:Symbol">·</span><span style="font-size:7.0pt">       
</span><span style="font-family:"Calibri",sans-serif">What if some other class has the same method type?  E.g. if someone wrote 
</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">class MyTR a where op :: TypeRep a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:"Calibri",sans-serif">would that mess up the use of reify# for Typeable?   Well it would if they also did</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">deriving instance Reifiable (MyTR a)<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:"Calibri",sans-serif">And there really is an ambiguity: what should (reify# k (tr :: TypeRep Int)) do?  Apply k to a TypeRep or to a MyTR?  So a complaint here would be entirely legitimate.</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:Symbol">·</span><span style="font-size:7.0pt">       
</span><span style="font-family:"Calibri",sans-serif">I suppose that another formulation might be to abstract over the constraint, rather than the method type, and use explicit type application at calls of reify#.  So</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">class Reifiable c where<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  type RL c :: *<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  reify# :: (c => r) -> RL c -> r<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:"Calibri",sans-serif">Now all calls of reify# would have to look like
</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">reify# @(Typeable Int) k tr<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:"Calibri",sans-serif">Maybe that’s acceptable.  But it doesn’t seem as nice to me.</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:Symbol">·</span><span style="font-size:7.0pt">       
</span><span style="font-family:"Calibri",sans-serif">One could use functional dependencies and a 2-parameter type class, but I don’t think it would change anything much.  If type functions work, they are more robust than fundeps.</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msolistparagraph"><span style="font-family:Symbol">·</span><span style="font-size:7.0pt">       
</span><span style="font-family:"Calibri",sans-serif">One could abstract over the type constructor rather than the type.  I see no advantage and some disadvantages</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">class Reifiable t where<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  type RC t :: * -> Constraint  -- Short for Reified Constraint<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843code">  reify# :: forall r. (RC t a => r) -> t a -> r<u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif"> </span><u></u><u></u></p>
<p class="MsoNormal"><span style="font-family:"Calibri",sans-serif"> </span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">-----Original Message-----</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">From: ghc-devs [<a href="mailto:ghc-devs-bounces@haskell.org" target="_blank">mailto:ghc-devs-bounces@haske<wbr>ll.org</a>] On Behalf Of David</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">Feuer</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">Sent: 11 December 2016 05:01</span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">To: ghc-devs <<a href="mailto:ghc-devs@haskell.org" target="_blank">ghc-devs@haskell.org</a>>; Edward Kmett <<a href="mailto:ekmett@gmail.com" target="_blank">ekmett@gmail.com</a>></span><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <span lang="EN-US">Subject: Magical function to support reflection</span><u></u><u></u></p>
<div>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  The following proposal (with fancier formatting and some improved<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  wording) can be viewed at<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <a href="https://ghc.haskell.org/trac/ghc/wiki/MagicalReflectionSupport" target="_blank">
<span style="color:windowtext;text-decoration:none">https://ghc.haskell.org/trac/g<wbr>hc/wiki/MagicalReflectionSuppo<wbr>rt</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  Using the Data.Reflection has some runtime costs. Notably, there can be no<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  inlining or unboxing of reified values. I think it would be nice to add a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  GHC special to support it. I'll get right to the point of what I want, and<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  then give a bit of background about why.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  === What I want<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  I propose the following absurdly over-general lie:<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify# :: (forall s . c s a => t s r) -> a -> r<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  `c` is assumed to be a single-method class with no superclasses whose<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  dictionary representation is exactly the same as the representation of `a`,<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  and `t s r` is assumed to be a newtype wrapper around `r`. In desugaring,<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify# f would be compiled to f@S, where S is a fresh type. I believe it's<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  necessary to use a fresh type to prevent specialization from mixing up<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  different reified values.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  === Background<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  Let me set up a few pieces. These pieces are slightly modified from what the<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  package actually does to make things cleaner under the hood, but the<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  differences are fairly shallow.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  newtype Tagged s a = Tagged { unTagged :: a }<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  unproxy :: (Proxy s -> a) -> Tagged s a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  unproxy f = Tagged (f Proxy)<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  class Reifies s a | s -> a where<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|    reflect' :: Tagged s a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  -- For convenience<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reflect :: forall s a proxy . Reifies s a => proxy s -> a reflect _ =<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  unTagged (reflect' :: Tagged s a)<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  -- The key function--see below regarding implementation reify' :: (forall s<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  . Reifies s a => Tagged s r) -> a -> r<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  -- For convenience<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify :: a -> (forall s . Reifies s a => Proxy s -> r) -> r reify a f =<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify' (unproxy f) a<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  The key idea of reify' is that something of type<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  forall s . Reifies s a => Tagged s r<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  is represented in memory exactly the same as a function of type<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  a -> r<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  So we can currently use unsafeCoerce to interpret one as the other.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  Following the general approach of the library, we can do this as such:<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  newtype Magic a r = Magic (forall s . Reifies s a => Tagged s r) reify' ::<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  (forall s . Reifies s a => Tagged s r) -> a -> r reify' f = unsafeCoerce<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  (Magic f)<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  This certainly works. The trouble is that any knowledge about what is<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reflected is totally lost. For instance, if I write<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify 12 $ \p -> reflect p + 3<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  then GHC will not see, at compile time, that the result is 15. If I write<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  reify (+1) $ \p -> reflect p x<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  then GHC will never inline the application of (+1). Etc.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  I'd like to replace reify' with reify# to avoid this problem.<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  Thanks,<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  David Feuer<u></u><u></u></p>
</div>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  ______________________________<wbr>_________________<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  ghc-devs mailing list<u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <a href="mailto:ghc-devs@haskell.org" target="_blank">
<span style="color:windowtext;text-decoration:none">ghc-devs@haskell.org</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext">|  <a href="https://na01.safelinks.protection.outlook.com/?url=http%3A%2F%2Fmail.haskell.org%2Fcgi-bin%2Fmailman%2Flistinfo%2Fghc-devs&data=02%7C01%7Csimonpj%40microsoft.com%7C488bf00986e34ac0833208d42182c47a%7C72f988bf86f141af91ab2d7cd011db47%7C1%7C0%7C636170292905032831&sdata=quvCny8vD%2Fw%2BjIIypEtungW3OWbVmCQxFAK4%2FXrX%2Bb8%3D&reserved=0" target="_blank">
<span style="color:windowtext;text-decoration:none">https://na01.safelinks.protect<wbr>ion.outlook.com/?url=http%3A%<wbr>2F%2Fmail.haskell</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext"><a href="https://na01.safelinks.protection.outlook.com/?url=http%3A%2F%2Fmail.haskell.org%2Fcgi-bin%2Fmailman%2Flistinfo%2Fghc-devs&data=02%7C01%7Csimonpj%40microsoft.com%7C488bf00986e34ac0833208d42182c47a%7C72f988bf86f141af91ab2d7cd011db47%7C1%7C0%7C636170292905032831&sdata=quvCny8vD%2Fw%2BjIIypEtungW3OWbVmCQxFAK4%2FXrX%2Bb8%3D&reserved=0" target="_blank"><span style="color:windowtext;text-decoration:none">| 
 .org%2Fcgi-bin%2Fmailman%2Flis<wbr>tinfo%2Fghc-</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext"><a href="https://na01.safelinks.protection.outlook.com/?url=http%3A%2F%2Fmail.haskell.org%2Fcgi-bin%2Fmailman%2Flistinfo%2Fghc-devs&data=02%7C01%7Csimonpj%40microsoft.com%7C488bf00986e34ac0833208d42182c47a%7C72f988bf86f141af91ab2d7cd011db47%7C1%7C0%7C636170292905032831&sdata=quvCny8vD%2Fw%2BjIIypEtungW3OWbVmCQxFAK4%2FXrX%2Bb8%3D&reserved=0" target="_blank"><span style="color:windowtext;text-decoration:none">| 
 devs&data=02%7C01%7Csimonpj%40<wbr>microsoft.com%7C488bf00986e34a<wbr>c0833208d42182c4</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext"><a href="https://na01.safelinks.protection.outlook.com/?url=http%3A%2F%2Fmail.haskell.org%2Fcgi-bin%2Fmailman%2Flistinfo%2Fghc-devs&data=02%7C01%7Csimonpj%40microsoft.com%7C488bf00986e34ac0833208d42182c47a%7C72f988bf86f141af91ab2d7cd011db47%7C1%7C0%7C636170292905032831&sdata=quvCny8vD%2Fw%2BjIIypEtungW3OWbVmCQxFAK4%2FXrX%2Bb8%3D&reserved=0" target="_blank"><span style="color:windowtext;text-decoration:none">| 
 7a%7C72f988bf86f141af91ab2d7cd<wbr>011db47%7C1%7C0%7C636170292905<wbr>032831&sdata=quv</span></a><u></u><u></u></p>
<p class="m_-9165023776007292584m_4007598627940039537m-4256948752900361843msoplaintext"><a href="https://na01.safelinks.protection.outlook.com/?url=http%3A%2F%2Fmail.haskell.org%2Fcgi-bin%2Fmailman%2Flistinfo%2Fghc-devs&data=02%7C01%7Csimonpj%40microsoft.com%7C488bf00986e34ac0833208d42182c47a%7C72f988bf86f141af91ab2d7cd011db47%7C1%7C0%7C636170292905032831&sdata=quvCny8vD%2Fw%2BjIIypEtungW3OWbVmCQxFAK4%2FXrX%2Bb8%3D&reserved=0" target="_blank"><span style="color:windowtext;text-decoration:none">| 
 Cny8vD%2Fw%2BjIIypEtungW3OWbVm<wbr>CQxFAK4%2FXrX%2Bb8%3D&<wbr>reserved=0</span></a><u></u><u></u></p>
</div>
</div>
</blockquote>
</div>
<p class="MsoNormal"><u></u> <u></u></p>
</div>
</div>
</div>
</div></div></div>
</div>
</div>

</blockquote></div><br></div>
</blockquote></div></div>