hlrdb-core-0.1.2.0: High-level Redis Database Core API

Safe HaskellNone
LanguageHaskell2010

HLRDB.Internal

Description

Internal module. Not intended for public use.

Synopsis

Documentation

probIO :: MonadIO m => Double -> m a -> m (Maybe a) Source #

unwrapCursor :: MonadRedis m => (a -> b) -> Redis (Either Reply (Cursor, a)) -> m (Maybe Cursor, b) Source #

ignore :: Functor f => f a -> f () Source #

fixEmpty :: (MonadRedis m, Monoid e, Traversable t) => ([b] -> Redis e) -> (a -> b) -> t a -> m e Source #

fixEmpty' :: (MonadRedis m, Traversable t, Integral i) => ([b] -> Redis i) -> (a -> b) -> t a -> m i Source #

foldM :: Foldable t => (a -> b) -> t a -> [b] Source #

data Int64 :: * #

64-bit signed integer type

Instances

Bounded Int64

Since: 2.1

Enum Int64

Since: 2.1

Eq Int64

Since: 2.1

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Integral Int64

Since: 2.1

Num Int64

Since: 2.1

Ord Int64

Since: 2.1

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Read Int64

Since: 2.1

Real Int64

Since: 2.1

Methods

toRational :: Int64 -> Rational #

Show Int64

Since: 2.1

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Ix Int64

Since: 2.1

Lift Int64 

Methods

lift :: Int64 -> Q Exp #

Storable Int64

Since: 2.1

Methods

sizeOf :: Int64 -> Int #

alignment :: Int64 -> Int #

peekElemOff :: Ptr Int64 -> Int -> IO Int64 #

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int64 #

pokeByteOff :: Ptr b -> Int -> Int64 -> IO () #

peek :: Ptr Int64 -> IO Int64 #

poke :: Ptr Int64 -> Int64 -> IO () #

Bits Int64

Since: 2.1

FiniteBits Int64

Since: 4.6.0.0

PrimType Int64 
PrimMemoryComparable Int64 
Subtractive Int64 

Associated Types

type Difference Int64 :: * #

Methods

(-) :: Int64 -> Int64 -> Difference Int64 #

Hashable Int64 

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

Prim Int64 
Unbox Int64 
Random Int64 

Methods

randomR :: RandomGen g => (Int64, Int64) -> g -> (Int64, g) #

random :: RandomGen g => g -> (Int64, g) #

randomRs :: RandomGen g => (Int64, Int64) -> g -> [Int64] #

randoms :: RandomGen g => g -> [Int64] #

randomRIO :: (Int64, Int64) -> IO Int64 #

randomIO :: IO Int64 #

Vector Vector Int64 
MVector MVector Int64 
type PrimSize Int64 
type PrimSize Int64 = 8
type Difference Int64 
type NatNumMaxBound Int64 
type NatNumMaxBound Int64 = 9223372036854775807
data Vector Int64 
data MVector s Int64