module Language.Haskell.GhcMod.Check (
    checkSyntax
  , check
  , expandTemplate
  , expand
  ) where
import Control.Applicative
import Prelude
import Language.Haskell.GhcMod.DynFlags
import qualified Language.Haskell.GhcMod.Gap as Gap
import Language.Haskell.GhcMod.Logger
import Language.Haskell.GhcMod.Monad
checkSyntax :: IOish m
            => [FilePath]  
            -> GhcModT m String
checkSyntax []    = return ""
checkSyntax files = either id id <$> check files
check :: IOish m
      => [FilePath]  
      -> GhcModT m (Either String String)
check files =
    runGmlTWith
      (map Left files)
      return
      ((fmap fst <$>) . withLogger Gap.setNoMaxRelevantBindings)
      (return ())
expandTemplate :: IOish m
               => [FilePath]  
               -> GhcModT m String
expandTemplate []    = return ""
expandTemplate files = either id id <$> expand files
expand :: IOish m => [FilePath] -> GhcModT m (Either String String)
expand files =
    runGmlTWith
      (map Left files)
      return
      ((fmap fst <$>) . withLogger (Gap.setDumpSplices . setNoWarningFlags))
      (return ())