]> code.delx.au - offlineimap/blobdiff - src/Network/IMAP/Connection.hs
Comment typo
[offlineimap] / src / Network / IMAP / Connection.hs
index 2172c50ca519a091ee5dec53e380bffe0d9def8b..2c06d20451cdc758515e9d415ca2bec54dae1474 100644 (file)
@@ -20,16 +20,19 @@ module Network.IMAP.Connection where
 import Network.IMAP.Types
 import Control.Monad.State
 import Data.List.Utils(spanList)
-import Data.List(genericSplitAt, genericLength)
+import Data.List(genericSplitAt, genericLength, intercalate)
 
--- | Take an IMAPString and treat it as messages from the server.
--- | Remember that EOL in IMAP protocols is \r\n!
+type IMAPState = State (IMAPString, IMAPString)
 
-stringConnection :: 
-    IMAPString ->               -- ^ The initial content of the buffer for the client to read from
-    IMAPString ->               -- ^ The initial content of the buffer for the client to write to
-    IMAPConnection (State (IMAPString, IMAPString))
-stringConnection sdata wdata =
+{- | Set up an IMAPConnection that runs in the State monad.
+
+The state is (bufferToClient, bufferFromClient)
+
+Remember that EOL in IMAP protocols is \r\n!
+
+closeConnection is ignored with this monad. -}
+newStringConnection :: IMAPConnection IMAPState
+newStringConnection =
     IMAPConnection {readBytes = lreadBytes,
                     readLine = lreadLine,
                     writeBytes = lwriteBytes,
@@ -47,10 +50,32 @@ stringConnection sdata wdata =
                  let (line, remainder) = spanList (\x -> "\r\n" /= take 2 x) s
                  case remainder of
                    [] -> fail "EOF in input in readLine"
-                   r -> do put (drop 2 r, sw) -- strip of \r\n
+                   r -> do put (drop 2 r, sw) -- strip off \r\n
                            return line
 
           lwriteBytes outdata =
               do (s, sw) <- get
                  put (s, sw ++ outdata)
 
+{- | Runs a State monad with a String connection.  Returns
+(retval, remainingBufferToClient, bufferFromClient) -}
+runStringConnection ::
+       IMAPString               -- ^ Buffer to send to clients
+    -> (IMAPConnection IMAPState -> IMAPState a) -- ^ Function to run
+    -> (a, (String, String))    -- ^ Results: func result, buffer status
+runStringConnection sbuf func =
+    runState (func newStringConnection) (sbuf::String, []::String)
+
+{- | Runs a State monad with a String connection, initializing it with 
+the passed lines.  -}
+runLinesConnection ::
+       [IMAPString]             -- ^ Buffer to send to clients
+    -> (IMAPConnection IMAPState -> IMAPState a) -- ^ Function to run
+    -> (a, (String, String))    -- ^ Results: func result, buffer status
+runLinesConnection sbuf func 
+    | sbuf == [] = 
+        -- For the empty input, no \r\n after.
+        runStringConnection [] func
+    | otherwise = 
+        -- Put \r\n between the lines, and also after the last one.
+        runStringConnection (intercalate "\r\n" sbuf ++ "\r\n") func
\ No newline at end of file