odd-jobs-0.1.0: A full-featured PostgreSQL-backed job queue (with an admin UI)

Safe HaskellNone
LanguageHaskell2010

OddJobs.Types

Synopsis

Documentation

type TableName = Query Source #

An alias for Query type. Since this type has an instance of IsString you do not need to do anything special to create a value for this type. Just ensure you have the OverloadedStrings extention enabled. For example:

{-# LANGUAGE OverloadedStrings #-}

myJobsTable :: TableName
myJobsTable = "my_jobs"

newtype Seconds Source #

Constructors

Seconds 

Fields

Instances
Eq Seconds Source # 
Instance details

Defined in OddJobs.Types

Methods

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

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

Num Seconds Source # 
Instance details

Defined in OddJobs.Types

Ord Seconds Source # 
Instance details

Defined in OddJobs.Types

Read Seconds Source # 
Instance details

Defined in OddJobs.Types

Show Seconds Source # 
Instance details

Defined in OddJobs.Types

delaySeconds :: MonadIO m => Seconds -> m () Source #

Convenience wrapper on-top of threadDelay which takes Seconds as an argument, instead of micro-seconds.