| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Simplex.Messaging.Util
Contents
Documentation
newtype InternalException e Source #
Constructors
| InternalException | |
| Fields 
 | |
Instances
| Eq e => Eq (InternalException e) Source # | |
| Defined in Simplex.Messaging.Util Methods (==) :: InternalException e -> InternalException e -> Bool # (/=) :: InternalException e -> InternalException e -> Bool # | |
| Show e => Show (InternalException e) Source # | |
| Defined in Simplex.Messaging.Util Methods showsPrec :: Int -> InternalException e -> ShowS # show :: InternalException e -> String # showList :: [InternalException e] -> ShowS # | |
| Exception e => Exception (InternalException e) Source # | |
| Defined in Simplex.Messaging.Util Methods toException :: InternalException e -> SomeException # fromException :: SomeException -> Maybe (InternalException e) # displayException :: InternalException e -> String # | |
raceAny_ :: MonadUnliftIO m => [m a] -> m () Source #
bshow :: Show a => a -> ByteString Source #
liftIOEither :: (MonadIO m, MonadError e m) => IO (Either e a) -> m a Source #
liftEitherError :: (MonadIO m, MonadError e' m) => (e -> e') -> IO (Either e a) -> m a Source #
Orphan instances
| (MonadUnliftIO m, Exception e) => MonadUnliftIO (ExceptT e m) Source # | |