beam-0.3.0.0: A type-safe SQL mapper for Haskell that doesn't use Template Haskell

Safe HaskellNone
LanguageHaskell2010

Database.Beam

Description

Top-level Beam module. This module re-exports all the symbols necessary for most common user operations.

The most interesting modules are Schema and Query.

SQL contains an internal representation of SQL that can be easily converted to textual SQL. Backend offers functions to run Beam queries and data manipulation commands within specific SQL backends.

For a series of tutorials, see my series of blog posts at

Synopsis

Documentation

class Typeable a

The class Typeable allows a concrete representation of a type to be calculated.

Minimal complete definition

typeRep#

class Generic a

Representable types of kind *. This class is derivable in GHC with the DeriveGeneric flag on.

Minimal complete definition

from, to

Instances

Generic Bool 
Generic Char 
Generic Double 
Generic Float 
Generic Int 
Generic Ordering 
Generic Exp 
Generic Match 
Generic Clause 
Generic Pat 
Generic Type 
Generic Dec 
Generic Name 
Generic FunDep 
Generic TyVarBndr 
Generic () 
Generic Void 
Generic All 
Generic Any 
Generic Arity 
Generic Fixity 
Generic Associativity 
Generic Doc 
Generic TextDetails 
Generic Style 
Generic Mode 
Generic ModName 
Generic PkgName 
Generic Module 
Generic OccName 
Generic NameFlavour 
Generic NameSpace 
Generic Loc 
Generic Info 
Generic ModuleInfo 
Generic Fixity 
Generic FixityDirection 
Generic Lit 
Generic Body 
Generic Guard 
Generic Stmt 
Generic Range 
Generic TySynEqn 
Generic FamFlavour 
Generic Foreign 
Generic Callconv 
Generic Safety 
Generic Pragma 
Generic Inline 
Generic RuleMatch 
Generic Phases 
Generic RuleBndr 
Generic AnnTarget 
Generic Strict 
Generic Con 
Generic TyLit 
Generic Role 
Generic AnnLookup 
Generic AutoId 
Generic [a] 
Generic (U1 p) 
Generic (Par1 p) 
Generic (Identity a) 
Generic (ZipList a) 
Generic (Dual a) 
Generic (Endo a) 
Generic (Sum a) 
Generic (Product a) 
Generic (First a) 
Generic (Last a) 
Generic (Maybe a) 
Generic (Either a b) 
Generic (Rec1 f p) 
Generic (a, b) 
Generic (Const a b) 
Generic (WrappedMonad m a) 
Generic (Proxy * t) 
Generic (K1 i c p) 
Generic ((:+:) f g p) 
Generic ((:*:) f g p) 
Generic ((:.:) f g p) 
Generic (a, b, c) 
Generic (WrappedArrow a b c) 
Generic (Alt k f a) 
Generic (M1 i c f p) 
Generic (a, b, c, d) 
Generic (a, b, c, d, e) 
Generic (a, b, c, d, e, f) 
Generic (a, b, c, d, e, f, g) 

data Identity a :: * -> *

Identity functor and monad. (a non-strict monad)

Since: 4.8.0.0

Instances

Monad Identity 
Functor Identity 
MonadFix Identity 
Applicative Identity 
Foldable Identity 
Traversable Identity 
Generic1 Identity 
MonadZip Identity 
Eq1 Identity 
Ord1 Identity 
Read1 Identity 
Show1 Identity 
MonadBaseControl Identity Identity 
Eq a => Eq (Identity a) 
Data a => Data (Identity a) 
Ord a => Ord (Identity a) 
Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Generic (Identity a) 
Table tbl => FromSqlValues (tbl Identity) Source 
type Rep1 Identity = D1 D1Identity (C1 C1_0Identity (S1 S1_0_0Identity Par1)) 
type StM Identity a = a 
type Rep (Identity a) = D1 D1Identity (C1 C1_0Identity (S1 S1_0_0Identity (Rec0 a))) 

liftIO :: MonadIO m => forall a. IO a -> m a

Lift a computation from the IO monad.

data Beam d m Source

class BeamBackend backendSettings Source

Minimal complete definition

openBeam

data BeamT e d m a Source

Instances

MonadTrans (BeamT e d) Source 
Monad m => Monad (BeamT e d m) Source 
Monad m => Functor (BeamT e d m) Source 
Monad m => Applicative (BeamT e d m) Source 
MonadIO m => MonadIO (BeamT e d m) Source 

data BeamResult e a Source

Constructors

Success a 
Rollback (BeamRollbackReason e) 

Instances

(Show e, Show a) => Show (BeamResult e a) Source