aws-lambda-haskell-runtime-2.0.6: Haskell runtime for AWS Lambda

Safe HaskellNone
LanguageHaskell2010

Aws.Lambda

Synopsis

Documentation

data ApiGatewayResponse body Source #

Instances
Functor ApiGatewayResponse Source # 
Instance details

Defined in Aws.Lambda.Runtime.ApiGatewayInfo

Show body => Show (ApiGatewayResponse body) Source # 
Instance details

Defined in Aws.Lambda.Runtime.ApiGatewayInfo

Generic (ApiGatewayResponse body) Source # 
Instance details

Defined in Aws.Lambda.Runtime.ApiGatewayInfo

Associated Types

type Rep (ApiGatewayResponse body) :: Type -> Type #

ToJSON body => ToJSON (ApiGatewayResponse body) Source # 
Instance details

Defined in Aws.Lambda.Runtime.ApiGatewayInfo

type Rep (ApiGatewayResponse body) Source # 
Instance details

Defined in Aws.Lambda.Runtime.ApiGatewayInfo

type Rep (ApiGatewayResponse body) = D1 (MetaData "ApiGatewayResponse" "Aws.Lambda.Runtime.ApiGatewayInfo" "aws-lambda-haskell-runtime-2.0.6-bDxQ9mM82RCeUFMK27qT8" False) (C1 (MetaCons "ApiGatewayResponse" PrefixI True) ((S1 (MetaSel (Just "apiGatewayResponseStatusCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Int) :*: S1 (MetaSel (Just "apiGatewayResponseHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ResponseHeaders)) :*: (S1 (MetaSel (Just "apiGatewayResponseBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 body) :*: S1 (MetaSel (Just "apiGatewayResponseIsBase64Encoded") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Bool))))

data Context Source #

Context that is passed to all the handlers

Instances
Generic Context Source # 
Instance details

Defined in Aws.Lambda.Runtime.Context

Associated Types

type Rep Context :: Type -> Type #

Methods

from :: Context -> Rep Context x #

to :: Rep Context x -> Context #

ToJSON Context Source # 
Instance details

Defined in Aws.Lambda.Runtime.Context

FromJSON Context Source # 
Instance details

Defined in Aws.Lambda.Runtime.Context

type Rep Context Source # 
Instance details

Defined in Aws.Lambda.Runtime.Context

initialize :: Throws Parsing => Throws EnvironmentVariableNotSet => Event -> IO Context Source #

Initializes the context out of the environment

data LambdaOptions Source #

Options that the generated main expects

Instances
Generic LambdaOptions Source # 
Instance details

Defined in Aws.Lambda.Runtime.Common

Associated Types

type Rep LambdaOptions :: Type -> Type #

type Rep LambdaOptions Source # 
Instance details

Defined in Aws.Lambda.Runtime.Common

type Rep LambdaOptions = D1 (MetaData "LambdaOptions" "Aws.Lambda.Runtime.Common" "aws-lambda-haskell-runtime-2.0.6-bDxQ9mM82RCeUFMK27qT8" False) (C1 (MetaCons "LambdaOptions" PrefixI True) ((S1 (MetaSel (Just "eventObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String) :*: S1 (MetaSel (Just "contextObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String)) :*: (S1 (MetaSel (Just "functionHandler") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String) :*: S1 (MetaSel (Just "executionUuid") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 String))))

generateLambdaDispatcher :: DispatcherStrategy -> DispatcherOptions -> DecsQ Source #

Generates a main function that acts as a dispatcher

decodeObj :: forall a. (FromJSON a, Typeable a) => String -> Either Parsing a Source #

Helper function that the dispatcher will use to decode the JSON that comes as an AWS Lambda event into the appropriate type expected by the handler.

encodeObj :: ToJSON a => a -> String Source #

Helper function that the dispatcher will use to decode the JSON that comes as an AWS Lambda event into the appropriate type expected by the handler.