hal-1.1: A runtime environment for Haskell applications running on AWS Lambda.
Copyright(c) Nike Inc. 2018
LicenseBSD3
Maintainernathan.fairhurst@nike.com, fernando.freire@nike.com
Stabilitystable
Safe HaskellSafe-Inferred
LanguageHaskell2010

AWS.Lambda.Combinators

Description

These combinators are for those who need to peek below the abstraction of the basic runtimes, for whatever reason.

They map functions (instead of values) to turn basic handlers into handlers compatible with the base runtime. These combinators allow us to expose functionality across many dimensions in an abstract way. It also allows simple building blocks for those who need to "get in the middle" or adapt the basic runtimes in new ways without rebuilding everything from the ground up.

Synopsis

Documentation

withoutContext :: a -> b -> a Source #

An alias of const, this upgrades a handler that does not accept LambdaContext as its first curried argument to one that does.

This allows us to use other combinators to construct a lambda runtime that accepts a handler that ignores LambdaContext.

In the example below, we reconstruct pureRuntime without actually using it. @ {-# LANGUAGE NamedFieldPuns, DeriveGeneric #-}

module Main where

import AWS.Lambda.Runtime (pureRuntimeWithContext) import AWS.Lambda.Combinators (withoutContext) import Data.Aeson (FromJSON) import GHC.Generics (Generic)

data Named = Named { name :: String } deriving Generic instance FromJSON Named

myHandler :: Named -> String myHandler (Named { name }) = "Hello, " ++ name

main :: IO () main = (pureRuntimeWithContext . withoutContext) myHandler @

withInfallibleParse :: FromJSON a => (a -> b) -> Value -> b Source #

This modifies a function to accept a JSON AST (Value), instead of its JSON parsable input. It also assumes that the JSON AST passed in will ALWAYS be convertable into the original input type.

This allows us to write handlers of the types we're interested in, but then map back to the "native" handler that is only guaranteed JSON (but not necessarily in a useful or restricted structure).

This is essentially the glue that converts the AWS.Lambda.Runtime.Value to (the more standard) AWS.Lambda.Runtime. While both export a mRuntimeWithContext, the difference is that the Value Runtime makes no attempt to convert the JSON AST, the standard Runtime does.

Rarely would this function be used directly, and you wouldn't want to use it at all, (directly or indirectly via Runtime runtimes), if you wanted to act on a failure to convert the JSON AST sent to the Lambda.

withFallibleParse :: FromJSON a => (a -> b) -> Value -> Either String b Source #

Like withInfallibleParse, but return the result in an Either instead of using error.