{-# LANGUAGE Trustworthy #-}
{-# LANGUAGE NoImplicitPrelude
, RankNTypes
, ExistentialQuantification
#-}
{-# OPTIONS_HADDOCK not-home #-}
module GHC.Desugar ((>>>), AnnotationWrapper(..), toAnnotationWrapper) where
import Control.Arrow (Arrow(..))
import Control.Category ((.))
import Data.Data (Data)
(>>>) :: forall arr. Arrow arr => forall a b c. arr a b -> arr b c -> arr a c
arr a b
f >>> :: forall (arr :: * -> * -> *) a b c.
Arrow arr =>
arr a b -> arr b c -> arr a c
>>> arr b c
g = arr b c
g arr b c -> arr a b -> arr a c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. arr a b
f
{-# INLINE (>>>) #-}
data AnnotationWrapper = forall a. (Data a) => AnnotationWrapper a
toAnnotationWrapper :: (Data a) => a -> AnnotationWrapper
toAnnotationWrapper :: forall a. Data a => a -> AnnotationWrapper
toAnnotationWrapper a
what = a -> AnnotationWrapper
forall a. Data a => a -> AnnotationWrapper
AnnotationWrapper a
what