module Fay.Compiler.GADT
  (convertGADT
  ) where
import           Language.Haskell.Exts hiding (name)
convertGADT :: GadtDecl a -> QualConDecl a
convertGADT d = case d of
  GadtDecl s name Nothing typ ->
    QualConDecl s tyvars context (ConDecl s name (convertFunc typ))
  GadtDecl s name (Just fs) _typ ->
    QualConDecl s tyvars context (RecDecl s name fs)
  where
    tyvars = Nothing
    context = Nothing
    convertFunc :: Type a -> [Type a]
    convertFunc (TyCon _ _) = []
    convertFunc (TyFun _ x xs) = x : convertFunc xs
    convertFunc (TyParen _ x) = convertFunc x
    convertFunc _ = []