| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
OddJobs.Types
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"
pgEventName :: TableName -> Query Source #
delaySeconds :: MonadIO m => Seconds -> m () Source #
Convenience wrapper on-top of threadDelay which takes Seconds as an
argument, instead of micro-seconds.