mongoDB-2.0.10: Driver (client) for MongoDB, a free, scalable, fast, document DBMS

Safe HaskellNone
LanguageHaskell2010

Database.MongoDB.Internal.Util

Description

Miscellaneous general functions and Show, Eq, and Ord instances for PortID

Synopsis

Documentation

mergesortM :: Monad m => (a -> a -> m Ordering) -> [a] -> m [a] Source

A monadic sort implementation derived from the non-monadic one in ghc's Prelude

mergesortM' :: Monad m => (a -> a -> m Ordering) -> [[a]] -> m [a] Source

merge_pairsM :: Monad m => (a -> a -> m Ordering) -> [[a]] -> m [[a]] Source

mergeM :: Monad m => (a -> a -> m Ordering) -> [a] -> [a] -> m [a] Source

wrap :: a -> [a] Source

shuffle :: [a] -> IO [a] Source

Randomly shuffle items in list

loop :: (Functor m, Monad m) => m (Maybe a) -> m [a] Source

Repeatedy execute action, collecting results, until it returns Nothing

untilSuccess :: (MonadError e m, Error e) => (a -> m b) -> [a] -> m b Source

Apply action to elements one at a time until one succeeds. Throw last error if all fail. Throw strMsg error if list is empty.

untilSuccess' :: MonadError e m => e -> (a -> m b) -> [a] -> m b Source

Apply action to elements one at a time until one succeeds. Throw last error if all fail. Throw given error if list is empty

whenJust :: Monad m => Maybe a -> (a -> m ()) -> m () Source

liftIOE :: (MonadIO m, Exception e, Exception e') => (e -> e') -> IO a -> m a Source

lift IOE monad to ErrorT monad over some MonadIO m

updateAssocs :: Eq k => k -> v -> [(k, v)] -> [(k, v)] Source

Change or insert value of key in association list

bitOr :: (Num a, Bits a) => [a] -> a Source

bit-or all numbers together

(<.>) :: Text -> Text -> Text Source

Concat first and second together with period in between. Eg. "hello" <.> "world" = "hello.world"

true1 :: Label -> Document -> Bool Source

Is field's value a 1 or True (MongoDB use both Int and Bools for truth values). Error if field not in document or field not a Num or Bool.

byteStringHex :: ByteString -> String Source

Hexadecimal string representation of a byte string. Each byte yields two hexadecimal characters.

byteHex :: Word8 -> String Source

Two char hexadecimal representation of byte