{-# LANGUAGE CPP #-}
module CabalHelper.Compiletime.Compat.Parsec
( absorbParsecFailure
, eitherParsec
) where
#if MIN_VERSION_Cabal(2,5,0)
import Distribution.Parsec
#else
import qualified Distribution.Compat.ReadP as Dist
import Distribution.Text
#endif
absorbParsecFailure :: String -> Either String a -> a
absorbParsecFailure _ (Right x) = x
absorbParsecFailure ctx (Left err) =
error $ "Error parsing in '"++ctx++"': " ++ err
#if !MIN_VERSION_Cabal(2,5,0)
eitherParsec :: Text t => String -> Either String t
eitherParsec i =
case filter ((=="") . snd) $ Dist.readP_to_S parse i of
(a,""):[] -> Right a
_ -> Left $ show i
#endif