postgrest-8.0.0: REST API for any Postgres database
Safe HaskellNone
LanguageHaskell2010

PostgREST.DbStructure.Proc

Synopsis

Documentation

data PgArg Source #

Constructors

PgArg 

Fields

Instances

Instances details
Eq PgArg Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Methods

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

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

Ord PgArg Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Methods

compare :: PgArg -> PgArg -> Ordering #

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

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

(>) :: PgArg -> PgArg -> Bool #

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

max :: PgArg -> PgArg -> PgArg #

min :: PgArg -> PgArg -> PgArg #

Generic PgArg Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Associated Types

type Rep PgArg :: Type -> Type #

Methods

from :: PgArg -> Rep PgArg x #

to :: Rep PgArg x -> PgArg #

ToJSON PgArg Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep PgArg Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep PgArg = D1 ('MetaData "PgArg" "PostgREST.DbStructure.Proc" "postgrest-8.0.0-4wwkfqOKlk5GjHJ3yFP36o" 'False) (C1 ('MetaCons "PgArg" 'PrefixI 'True) ((S1 ('MetaSel ('Just "pgaName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "pgaType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "pgaReq") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "pgaVar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

data PgType Source #

Instances

Instances details
Eq PgType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Methods

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

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

Ord PgType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Generic PgType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Associated Types

type Rep PgType :: Type -> Type #

Methods

from :: PgType -> Rep PgType x #

to :: Rep PgType x -> PgType #

ToJSON PgType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep PgType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep PgType = D1 ('MetaData "PgType" "PostgREST.DbStructure.Proc" "postgrest-8.0.0-4wwkfqOKlk5GjHJ3yFP36o" 'False) (C1 ('MetaCons "Scalar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Composite" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QualifiedIdentifier)))

data ProcDescription Source #

Instances

Instances details
Eq ProcDescription Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Ord ProcDescription Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Generic ProcDescription Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Associated Types

type Rep ProcDescription :: Type -> Type #

ToJSON ProcDescription Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep ProcDescription Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

data ProcVolatility Source #

Constructors

Volatile 
Stable 
Immutable 

Instances

Instances details
Eq ProcVolatility Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Ord ProcVolatility Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Generic ProcVolatility Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Associated Types

type Rep ProcVolatility :: Type -> Type #

ToJSON ProcVolatility Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep ProcVolatility Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep ProcVolatility = D1 ('MetaData "ProcVolatility" "PostgREST.DbStructure.Proc" "postgrest-8.0.0-4wwkfqOKlk5GjHJ3yFP36o" 'False) (C1 ('MetaCons "Volatile" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Stable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Immutable" 'PrefixI 'False) (U1 :: Type -> Type)))

type ProcsMap = HashMap QualifiedIdentifier [ProcDescription] Source #

A map of all procs, all of which can be overloaded(one entry will have more than one ProcDescription). | It uses a HashMap for a faster lookup.

data RetType Source #

Constructors

Single PgType 
SetOf PgType 

Instances

Instances details
Eq RetType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Methods

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

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

Ord RetType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Generic RetType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

Associated Types

type Rep RetType :: Type -> Type #

Methods

from :: RetType -> Rep RetType x #

to :: Rep RetType x -> RetType #

ToJSON RetType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep RetType Source # 
Instance details

Defined in PostgREST.DbStructure.Proc

type Rep RetType = D1 ('MetaData "RetType" "PostgREST.DbStructure.Proc" "postgrest-8.0.0-4wwkfqOKlk5GjHJ3yFP36o" 'False) (C1 ('MetaCons "Single" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PgType)) :+: C1 ('MetaCons "SetOf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PgType)))

specifiedProcArgs :: Set FieldName -> ProcDescription -> [PgArg] Source #

Search the procedure parameters by matching them with the specified keys. If the key doesn't match a parameter, a parameter with a default type "text" is assumed.