-- | Backwards compatible 'catch' and 'try'
module GF.System.Catch where
import qualified System.IO.Error as S

-- ** Backwards compatible try and catch
catch :: IO a -> (IOError -> IO a) -> IO a
catch = IO a -> (IOError -> IO a) -> IO a
forall a. IO a -> (IOError -> IO a) -> IO a
S.catchIOError
try :: IO a -> IO (Either IOError a)
try = IO a -> IO (Either IOError a)
forall a. IO a -> IO (Either IOError a)
S.tryIOError