{-# LANGUAGE CPP #-}
module Network.TLS.ErrT
( runErrT
, ErrT
, Error(..)
, MonadError(..)
) where
#if MIN_VERSION_mtl(2,2,1)
import Control.Monad.Except
import Control.Monad.Error.Class (Error(..))
runErrT :: ExceptT e m a -> m (Either e a)
runErrT :: ExceptT e m a -> m (Either e a)
runErrT = ExceptT e m a -> m (Either e a)
forall e (m :: * -> *) a. ExceptT e m a -> m (Either e a)
runExceptT
type ErrT = ExceptT
#else
import Control.Monad.Error
runErrT :: ErrorT e m a -> m (Either e a)
runErrT = runErrorT
type ErrT = ErrorT
#endif