{-# LANGUAGE CPP #-} {- -optP-include -optPdist/build/autogen/cabal_macros.h -} module Data.Extensible.TH__ (thClassInstances) where { import Language.Haskell.TH; #if MIN_VERSION_template_haskell(2,7,0) thClassInstances :: Name -> Q [[Type]]; thClassInstances = fmap (\(ClassI _ y) -> fmap (reverse . \(InstanceD _ x _) -> t x) y) . reify where { t :: Type -> [Type]; t (AppT x y) = y : t x; t _ = []; }; #else thClassInstances :: Name -> Q [[Type]]; thClassInstances = fmap (\(ClassI _ x) -> map ci_tys x) . reify; #endif }