|
| Text.IMAPParsers | | Portability | portable | | Stability | stable | | Maintainer | mukai@jmuk.org |
|
|
|
| Description |
| Parsers for IMAP server responses
|
|
| Synopsis |
|
| type Mailbox = String | | | type UID = Word64 | | | type Charset = String | | | data MailboxInfo = MboxInfo {} | | | | | | | data MboxUpdate = MboxUpdate {} | | | | | | | | | data RespDerivs = RespDerivs {} | | | eval :: (RespDerivs -> Result RespDerivs r) -> String -> ByteString -> r | | | parse :: String -> Pos -> ByteString -> RespDerivs | | | eval' :: (RespDerivs -> Result RespDerivs r) -> String -> String -> r | | | parse' :: String -> Pos -> String -> RespDerivs | | | pNone :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, ()) | | | pCapability :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [String]) | | | pList :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [([Attribute], String, Mailbox)]) | | | pLsub :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [([Attribute], String, Mailbox)]) | | | pStatus :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [(MailboxStatus, Integer)]) | | | pExpunge :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [Integer]) | | | pSearch :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [UID]) | | | pSelect :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, MailboxInfo) | | | pFetch :: RespDerivs -> Result RespDerivs (ServerResponse, MboxUpdate, [(Integer, [(String, String)])]) | | | pDone :: RespDerivs -> Result RespDerivs ServerResponse | | | pFlag :: Parser RespDerivs Flag | | | pParenFlags :: RespDerivs -> Result RespDerivs [Flag] | | | atomChar :: Derivs d => Parser d Char | | | pNumberedLine :: String -> Parser RespDerivs Integer | | | pRecentLine :: Parser RespDerivs Integer | | | pExpungeLine :: Parser RespDerivs Integer | | | pExistsLine :: Parser RespDerivs Integer | | | pOtherLine :: Parser RespDerivs (Either (String, Integer) b) | | | pCapabilityLine :: Parser RespDerivs (Either a [String]) | | | pListLine :: String -> Parser RespDerivs (Either a ([Attribute], String, Mailbox)) | | | pStatusLine :: Parser RespDerivs (Either a [(MailboxStatus, Integer)]) | | | pSearchLine :: Parser RespDerivs (Either a [UID]) | | | pSelectLine :: Parser RespDerivs (MailboxInfo -> MailboxInfo) | | | pFetchLine :: Parser RespDerivs (Either a (Integer, [(String, String)])) | | | crlf :: String | | | crlfP :: Derivs d => Parser d String | | | lookups :: Eq a => a -> [(a, b)] -> [b] | | | catRights :: [Either a b] -> [b] | | | catLefts :: [Either a b] -> [a] | | | isRight :: Either a b -> Bool | | | isLeft :: Either a b -> Bool | | | getLeft :: Either a b -> a | | | getRight :: Either a b -> b |
|
|
| Documentation |
|
|
|
|
|
|
|
|
| Constructors | | Instances | |
|
|
|
| Constructors | | Seen | | | Answered | | | Flagged | | | Deleted | | | Draft | | | Recent | | | Keyword String | |
| Instances | |
|
|
|
| Constructors | | Noinferiors | | | Noselect | | | Marked | | | Unmarked | | | OtherAttr String | |
| Instances | |
|
|
|
| Constructors | | Instances | |
|
|
|
| Constructors | | ALERT | | | BADCHARSET [Charset] | | | CAPABILITY_sc [String] | | | PARSE | | | PERMANENTFLAGS [Flag] | | | READ_ONLY | | | READ_WRITE | | | TRYCREATE | | | UIDNEXT_sc UID | | | UIDVALIDITY_sc UID | | | UNSEEN_sc Integer | |
| Instances | |
|
|
|
| Constructors | | Instances | |
|
|
|
| the query data type for the status command
| | Constructors | | MESSAGES | the number of messages in the mailbox
| | RECENT | the number of messages with the Recent flag set
| | UIDNEXT | the next unique identifier value of the mailbox
| | UIDVALIDITY | the unique identifier validity value of the mailbox
|
| Instances | |
|
|
|
| Constructors | | Instances | |
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
| lookups :: Eq a => a -> [(a, b)] -> [b] | Source |
|
|
|
|
|
|
|
|
|
|
|
|
|
|
| Produced by Haddock version 2.6.0 |