| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Network.Mail.Postie
Synopsis
- run :: Int -> Application -> IO ()
- runSettings :: Settings -> Application -> IO ()
- runSettingsSocket :: Settings -> Socket -> Application -> IO ()
- module Network.Mail.Postie.Types
- module Network.Mail.Postie.Settings
- module Network.Mail.Postie.Address
- data UnexpectedEndOfInputException
- data TooMuchDataException
- type Producer b = Proxy X () () b
- type Consumer a = Proxy () a () X
- runEffect :: Monad m => Effect m r -> m r
- (>->) :: forall (m :: Type -> Type) a' a b r c' c. Functor m => Proxy a' a () b m r -> Proxy () b c' c m r -> Proxy a' a c' c m r
Documentation
Runs server with a given application on a specified port
runSettings :: Settings -> Application -> IO () Source #
Runs server with a given application and settings
runSettingsSocket :: Settings -> Socket -> Application -> IO () Source #
Application
module Network.Mail.Postie.Types
Settings
module Network.Mail.Postie.Settings
Address
module Network.Mail.Postie.Address
Exceptions
data UnexpectedEndOfInputException Source #
Instances
| Show UnexpectedEndOfInputException Source # | |
Defined in Network.Mail.Postie.Pipes Methods showsPrec :: Int -> UnexpectedEndOfInputException -> ShowS # show :: UnexpectedEndOfInputException -> String # showList :: [UnexpectedEndOfInputException] -> ShowS # | |
| Exception UnexpectedEndOfInputException Source # | |
data TooMuchDataException Source #
Instances
| Show TooMuchDataException Source # | |
Defined in Network.Mail.Postie.Pipes Methods showsPrec :: Int -> TooMuchDataException -> ShowS # show :: TooMuchDataException -> String # showList :: [TooMuchDataException] -> ShowS # | |
| Exception TooMuchDataException Source # | |
Defined in Network.Mail.Postie.Pipes Methods toException :: TooMuchDataException -> SomeException # fromException :: SomeException -> Maybe TooMuchDataException # | |
Re-exports
runEffect :: Monad m => Effect m r -> m r #
Run a self-contained Effect, converting it back to the base monad
Arguments
| :: forall (m :: Type -> Type) a' a b r c' c. Functor m | |
| => Proxy a' a () b m r | |
| -> Proxy () b c' c m r | |
| -> Proxy a' a c' c m r |
Pipe composition, analogous to the Unix pipe operator
(>->) ::Functorm =>Producerb m r ->Consumerb m r ->Effectm r (>->) ::Functorm =>Producerb m r ->Pipeb c m r ->Producerc m r (>->) ::Functorm =>Pipea b m r ->Consumerb m r ->Consumera m r (>->) ::Functorm =>Pipea b m r ->Pipeb c m r ->Pipea c m r
The following diagrams show the flow of information:
+-----------+ +-----------+ +-------------+
| | | | | |
| | | | | |
a ==> f ==> b ==> g ==> c = a ==> f >-> g ==> c
| | | | | |
| | | | | | | | |
+-----|-----+ +-----|-----+ +------|------+
v v v
r r r
For a more complete diagram including bidirectional flow, see "Pipes.Core#pull-diagram".