Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
- identity :: a -> a
- map :: Functor f => (a -> b) -> f a -> f b
- uncons :: [a] -> Maybe (a, [a])
- unsnoc :: [x] -> Maybe ([x], x)
- applyN :: Int -> (a -> a) -> a -> a
- print :: (MonadIO m, Show a) => a -> m ()
- throwIO :: (MonadIO m, Exception e) => e -> m a
- throwTo :: (MonadIO m, Exception e) => ThreadId -> e -> m ()
- show :: (Show a, StringConv String b) => a -> b
- pass :: Applicative f => f ()
- guarded :: Alternative f => (a -> Bool) -> a -> f a
- guardedA :: (Functor f, Alternative t) => (a -> f Bool) -> a -> f (t a)
- type LText = Text
- type LByteString = ByteString
- liftIO1 :: MonadIO m => (a -> IO b) -> a -> m b
- liftIO2 :: MonadIO m => (a -> b -> IO c) -> a -> b -> m c
- die :: Text -> IO a
Documentation
pass :: Applicative f => f () Source #
Do nothing returning unit inside applicative.
guarded :: Alternative f => (a -> Bool) -> a -> f a Source #
type LByteString = ByteString Source #
liftIO1 :: MonadIO m => (a -> IO b) -> a -> m b Source #
Lift an IO
operation with 1 argument into another monad