{-# LANGUAGE CPP #-}

-- | A simple compat ErrorT and other error stuff
module Network.TLS.ErrT (
    runErrT,
    ErrT,
    MonadError (..),
) where

import Control.Monad.Except (MonadError (..))
import Control.Monad.Trans.Except (ExceptT, runExceptT)

runErrT :: ExceptT e m a -> m (Either e a)
runErrT :: forall e (m :: * -> *) a. 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