module Development.IDE.GHC.Compat.ExactPrint
#if MIN_VERSION_ghc(9,3,0)
( ) where
#else
( ExactPrint
, exactPrint
, makeDeltaAst
, Retrie.Annotated, pattern Annotated, astA, annsA
) where
#if !MIN_VERSION_ghc(9,2,0)
import Control.Arrow ((&&&))
#else
import Development.IDE.GHC.Compat.Parser
#endif
import Language.Haskell.GHC.ExactPrint as Retrie
import qualified Retrie.ExactPrint as Retrie
#if !MIN_VERSION_ghc(9,2,0)
class ExactPrint ast where
makeDeltaAst :: ast -> ast
makeDeltaAst = id
instance ExactPrint ast
#endif
#if !MIN_VERSION_ghc(9,2,0)
pattern Annotated :: ast -> Anns -> Retrie.Annotated ast
pattern Annotated {astA, annsA} <- (Retrie.astA &&& Retrie.annsA -> (astA, annsA))
#else
pattern Annotated :: ast -> ApiAnns -> Retrie.Annotated ast
pattern $mAnnotated :: forall {r} {ast}.
Annotated ast -> (ast -> ApiAnns -> r) -> ((# #) -> r) -> r
Annotated {forall ast. Annotated ast -> ast
astA, forall ast. Annotated ast -> ApiAnns
annsA} <- ((,()) . Retrie.astA -> (astA, annsA))
#endif
#endif