I'm trying to figure out why this function from ConCat.AltCat is not
getting inlined:

(&&&) :: forall k a c d. (MProductCat k, Ok3 k a c d)
      => (a `k` c) -> (a `k` d) -> (a `k` Prod k c d)
f &&& g = (f *** g) . dup
  <+ okProd @k @a @a
  <+ okProd @k @c @d
{-# INLINE (&&&) #-}

So I put

{-# OPTIONS_GHC -dinline-check ConCat.AltCat.&&& #-}

in the importing module.  Alas, I'm getting no output on &&&.  I can get
output from lots of other functions - I'm guessing it might be because
of the name.

Could somebody help me enable the inline check?  Would be much
appreciated!

-- 
Regards,
Mike

_______________________________________________
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://mail.haskell.org/cgi-bin/mailman/listinfo/glasgow-haskell-users

Reply via email to