Copyright | This file is part of the package vimeta. It is subject to the license terms in the LICENSE file found in the top-level directory of this distribution and at: https://github.com/pjones/vimeta No part of this package including this file may be copied modified propagated or distributed except according to the terms contained in the LICENSE file. |
---|---|
License | BSD-2-Clause |
Safe Haskell | None |
Language | Haskell2010 |
Synopsis
- newtype Vimeta m a = Vimeta {}
- data Context = Context {}
- class Monad m => MonadIO (m :: Type -> Type)
- throwError :: MonadError e m => e -> m a
- runIO :: MonadIO m => IO a -> Vimeta m a
- runIOE :: MonadIO m => IO (Either String a) -> Vimeta m a
- tmdb :: MonadIO m => TheMovieDB a -> Vimeta m a
- verbose :: MonadIO m => Text -> Vimeta m ()
- execVimetaWithContext :: (MonadIO m, MonadMask m) => Context -> Vimeta m a -> m (Either String a)
- execVimeta :: (MonadIO m, MonadMask m) => (Config -> Config) -> Vimeta m a -> m (Either String a)
- runVimeta :: (MonadIO m, MonadMask m) => Vimeta m a -> m (Either String a)
Documentation
Instances
MonadReader Context (Vimeta m) Source # | |
Monad m => MonadError String (Vimeta m) Source # | |
Defined in Vimeta.Core.Vimeta throwError :: String -> Vimeta m a # catchError :: Vimeta m a -> (String -> Vimeta m a) -> Vimeta m a # | |
Monad (Vimeta m) Source # | |
Functor (Vimeta m) Source # | |
Applicative (Vimeta m) Source # | |
MonadIO m => MonadIO (Vimeta m) Source # | |
Defined in Vimeta.Core.Vimeta | |
MonadByline (Vimeta m) Source # | |
Defined in Vimeta.Core.Vimeta liftByline :: F PrimF a -> Vimeta m a |
Context | |
|
class Monad m => MonadIO (m :: Type -> Type) #
Monads in which IO
computations may be embedded.
Any monad built by applying a sequence of monad transformers to the
IO
monad will be an instance of this class.
Instances should satisfy the following laws, which state that liftIO
is a transformer of monads:
Instances
throwError :: MonadError e m => e -> m a #
Is used within a monadic computation to begin exception processing.
execVimetaWithContext :: (MonadIO m, MonadMask m) => Context -> Vimeta m a -> m (Either String a) Source #