servant-github-webhook-0.4.2.0: Servant combinators to facilitate writing GitHub webhooks.

Copyright(c) Jacob Thomas Errington 2016
LicenseMIT
Maintainerservant-github-webhook@mail.jerrington.me
Stabilityexperimental
Safe HaskellNone
LanguageHaskell2010

Servant.GitHub.Webhook

Contents

Description

The GitHub webhook machinery will attach three headers to the HTTP requests that it fires: X-Github-Event, X-Hub-Signature, and X-Github-Delivery. The former two headers correspond with the GitHubEvent and GitHubSignedReqBody'' routing combinators. This library ignores the X-Github-Delivery header; if you would like to access its value, then use the builtin Header combinator from Servant.

Usage of the library is straightforward: protect routes with the GitHubEvent combinator to ensure that the route is only reached for specific RepoWebhookEvents, and replace any ReqBody combinators you would write under that route with GitHubSignedReqBody. It is advised to always include a GitHubSignedReqBody'', as this is the only way you can be sure that it is GitHub who is sending the request, and not a malicious user. If you don't care about the request body, then simply use Aeson's Object type as the deserialization target -- GitHubSignedReqBody' key '[JSON] Object -- and ignore the Object in the handler.

The GitHubSignedReqBody'' combinator makes use of the Servant Context in order to extract the signing key. This is the same key that must be entered in the configuration of the webhook on GitHub. See GitHubKey' for more details.

In order to support multiple keys on a per-route basis, the basic combinator GitHubSignedReqBody'' takes as a type parameter as a key index. To use this, create a datatype, e.g. KeyIndex whose constructors identify the different keys you will be using. Generally, this means one constructor per repository. Use the DataKinds extension to promote this datatype to a kind, and write an instance of Reflect for each promoted constructor of your datatype. Finally, create a Context containing GitHubKey' whose wrapped function's domain is the datatype you've built up. Thus, your function can determine which key to retrieve.

Synopsis

Servant combinators

data GitHubSignedReqBody'' (proxy :: KProxy k) (key :: k) (list :: [*]) (result :: *) Source #

A clone of Servant's ReqBody combinator, except that it will also verify the signature provided by GitHub in the X-Hub-Signature header by computing the SHA1 HMAC of the request body and comparing.

The use of this combinator will require that the router context contain an appropriate GitHubKey' entry. Specifically, the type parameter of GitHubKey' must correspond with Demote k where k is the kind of the index key used here. Consequently, it will be necessary to use serveWithContext instead of serve.

Other routes are not tried upon the failure of this combinator, and a 401 response is generated.

Use of this datatype directly is discouraged, since the choice of the index key determines its kind k and hence proxy, which is . Instead, use GitHubSignedReqBody', which computes the proxy argument given just key. The proxy argument is necessary to avoid UndecidableInstances for the implementation of the HasServer instance for the datatype.

Instances
(HasServer sublayout context, HasContextEntry context (GitHubKey' (Demote key) result), Reflect key, AllCTUnrender list result) => HasServer (GitHubSignedReqBody'' (KProxy :: KProxy k) key list result :> sublayout :: Type) context Source # 
Instance details

Defined in Servant.GitHub.Webhook

Associated Types

type ServerT (GitHubSignedReqBody'' KProxy key list result :> sublayout) m :: Type #

Methods

route :: Proxy (GitHubSignedReqBody'' KProxy0 key list result :> sublayout) -> Context context -> Delayed env (Server (GitHubSignedReqBody'' KProxy0 key list result :> sublayout)) -> Router env #

hoistServerWithContext :: Proxy (GitHubSignedReqBody'' KProxy0 key list result :> sublayout) -> Proxy context -> (forall x. m x -> n x) -> ServerT (GitHubSignedReqBody'' KProxy0 key list result :> sublayout) m -> ServerT (GitHubSignedReqBody'' KProxy0 key list result :> sublayout) n #

type ServerT (GitHubSignedReqBody'' (KProxy :: KProxy k) key list result :> sublayout :: Type) m Source # 
Instance details

Defined in Servant.GitHub.Webhook

type ServerT (GitHubSignedReqBody'' (KProxy :: KProxy k) key list result :> sublayout :: Type) m = (Demote key, result) -> ServerT sublayout m

type GitHubSignedReqBody' (key :: k) = GitHubSignedReqBody'' (KProxy :: KProxy k) key Source #

Convenient synonym for GitHubSignedReqBody'' that computes its first type argument given just the second one.

Use this type synonym if you are creating a webhook server to handle webhooks from multiple repositories, with different secret keys.

type GitHubSignedReqBody = GitHubSignedReqBody' () Source #

A convenient alias for a trivial key index.

USe this type synonym if you are creating a webhook server to handle only webhooks from a single repository, or for mutliple repositories using the same secret key.

data GitHubEvent (events :: [RepoWebhookEvent]) Source #

A routing combinator that succeeds only for a webhook request that matches one of the given RepoWebhookEvent given in the type-level list events.

If the list contains WebhookWildcardEvent, then all events will be matched.

The combinator will require that its associated handler take a RepoWebhookEvent parameter, and the matched event will be passed to the handler. This allows the handler to determine which event triggered it from the list.

Other routes are tried if there is a mismatch.

Instances
(Reflect events, HasServer sublayout context) => HasServer (GitHubEvent events :> sublayout :: Type) context Source # 
Instance details

Defined in Servant.GitHub.Webhook

Associated Types

type ServerT (GitHubEvent events :> sublayout) m :: Type #

Methods

route :: Proxy (GitHubEvent events :> sublayout) -> Context context -> Delayed env (Server (GitHubEvent events :> sublayout)) -> Router env #

hoistServerWithContext :: Proxy (GitHubEvent events :> sublayout) -> Proxy context -> (forall x. m x -> n x) -> ServerT (GitHubEvent events :> sublayout) m -> ServerT (GitHubEvent events :> sublayout) n #

type ServerT (GitHubEvent events :> sublayout :: Type) m Source # 
Instance details

Defined in Servant.GitHub.Webhook

type ServerT (GitHubEvent events :> sublayout :: Type) m = RepoWebhookEvent -> ServerT sublayout m

Security

newtype GitHubKey' key result Source #

A wrapper for an IO strategy to obtain the signing key for the webhook as configured in GitHub. The strategy is executed each time the GitHubSignedReqBody's routing logic is executed.

We allow the use of IO here so that you can fetch the key from a cache or a database. If the key is a constant or read only once, just use pure.

The type key used here must correspond with Demote k where k is the kind whose types are used as indices in GitHubSignedReqBody'.

If you don't care about indices and just want to write a webhook using a global key, see GitHubKey' which fixes key to () and use gitHubKey, which fills the newtype with a constant function.

Constructors

GitHubKey 

Fields

type GitHubKey result = GitHubKey' () result Source #

A synonym for strategies producing so-called global keys, in which the key index is simply ().

gitHubKey :: IO ByteString -> GitHubKey result Source #

Smart constructor for GitHubKey', for a so-called global key.

dynamicKey :: (Text -> IO (Maybe ByteString)) -> (result -> Maybe Text) -> GitHubKey result Source #

dynamicKey keyLookup keyIdLookup acquires the key identifier, such as repository or user name, from the result then uses keyLookup to acquire the key (or Nothing).

Dynamic keys allow servers to specify per-user repository keys. This limits the impact of compromized keys and allows the server to acquire the key from external sources, such as a live configuration or per-user rows in a database.

class HasRepository r Source #

The HasRepository class helps extract the full (unique) "name/repo" of a repository, allowing easy lookup of a per-repository key or, using takeWhile (=''), lookup of per user keys.

Minimal complete definition

getFullName

Instances
HasRepository Object Source # 
Instance details

Defined in Servant.GitHub.Webhook

HasRepository Value Source # 
Instance details

Defined in Servant.GitHub.Webhook

EventHasRepo e => HasRepository (EventWithHookRepo e) Source # 
Instance details

Defined in Servant.GitHub.Webhook

newtype EventWithHookRepo e Source #

For use with 'github-webhooks' package types. Routes would look like:

     api = "github-webevent" :>
         :> GitHubSignedReqBody '[JSON] (EventWithHookRepo IssuesEvent)
         :> Post '[JSON] ()

And the handler would unwrap the event:

handler :: EventWithHookRepo IssuesEvent -> Handler ()
handler (eventOf -> e) = -- ... expr handling e :: IssuesEvent ...

Constructors

EventWithHookRepo 

Fields

Reexports

We reexport a few datatypes that are typically needed to use the library.

data RepoWebhookEvent #

Instances
Eq RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Data RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoWebhookEvent -> c RepoWebhookEvent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoWebhookEvent #

toConstr :: RepoWebhookEvent -> Constr #

dataTypeOf :: RepoWebhookEvent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoWebhookEvent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoWebhookEvent) #

gmapT :: (forall b. Data b => b -> b) -> RepoWebhookEvent -> RepoWebhookEvent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoWebhookEvent -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoWebhookEvent -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepoWebhookEvent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoWebhookEvent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoWebhookEvent -> m RepoWebhookEvent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoWebhookEvent -> m RepoWebhookEvent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoWebhookEvent -> m RepoWebhookEvent #

Ord RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Show RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Generic RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Associated Types

type Rep RepoWebhookEvent :: Type -> Type #

ToJSON RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

FromJSON RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Binary RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

NFData RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

Methods

rnf :: RepoWebhookEvent -> () #

Reflect WebhookWatchEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookTeamAddEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookStatusEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookReleaseEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPushEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPullRequestReviewCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPullRequestEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPublicEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPingEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPageBuildEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookMemberEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookIssuesEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookIssueCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookInstallationRepositoriesEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookInstallationEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookGollumEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookForkEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeploymentStatusEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeploymentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeleteEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookCreateEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookCommitCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookWildcardEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

type Rep RepoWebhookEvent 
Instance details

Defined in GitHub.Data.Webhooks

type Rep RepoWebhookEvent = D1 (MetaData "RepoWebhookEvent" "GitHub.Data.Webhooks" "github-0.22-2Kfeb7xwe5L26c2mM4Q5bp" False) (((((C1 (MetaCons "WebhookWildcardEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookCheckRunEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookCheckSuiteEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookCommitCommentEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookContentReferenceEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookCreateEvent" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "WebhookDeleteEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookDeployKeyEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookDeploymentEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookDeploymentStatusEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookDownloadEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookFollowEvent" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "WebhookForkEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookForkApplyEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookGitHubAppAuthorizationEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookGistEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookGollumEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookInstallationEvent" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "WebhookInstallationRepositoriesEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookIssueCommentEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookIssuesEvent" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "WebhookLabelEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookMarketplacePurchaseEvent" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "WebhookMemberEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookMembershipEvent" PrefixI False) (U1 :: Type -> Type)))))) :+: ((((C1 (MetaCons "WebhookMetaEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookMilestoneEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookOrganizationEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookOrgBlockEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookPageBuildEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookPingEvent" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "WebhookProjectCardEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookProjectColumnEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookProjectEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookPublicEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookPullRequestEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookPullRequestReviewEvent" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "WebhookPullRequestReviewCommentEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookPushEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookRegistryPackageEvent" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "WebhookReleaseEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookRepositoryEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookRepositoryImportEvent" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "WebhookRepositoryVulnerabilityAlertEvent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WebhookSecurityAdvisoryEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookStarEvent" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "WebhookStatusEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookTeamEvent" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "WebhookTeamAddEvent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WebhookWatchEvent" PrefixI False) (U1 :: Type -> Type)))))))
type Demote' (KProxy :: KProxy RepoWebhookEvent) Source # 
Instance details

Defined in Servant.GitHub.Webhook

data KProxy t #

A concrete, promotable proxy type, for use at the kind level There are no instances for this because it is intended at the kind level only

Constructors

KProxy 

Implementation details

Type-level programming machinery

type Demote (a :: k) = Demote' (KProxy :: KProxy k) Source #

Convient alias for Demote' that allows us to avoid using KProxy explicitly.

type family Demote' (kparam :: KProxy k) :: * Source #

Type function that reflects a kind to a type.

Instances
type Demote' (KProxy :: KProxy Symbol) Source # 
Instance details

Defined in Servant.GitHub.Webhook

type Demote' (KProxy :: KProxy ()) Source # 
Instance details

Defined in Servant.GitHub.Webhook

type Demote' (KProxy :: KProxy ()) = ()
type Demote' (KProxy :: KProxy RepoWebhookEvent) Source # 
Instance details

Defined in Servant.GitHub.Webhook

type Demote' (KProxy :: KProxy [k]) Source # 
Instance details

Defined in Servant.GitHub.Webhook

type Demote' (KProxy :: KProxy [k]) = [Demote' (KProxy :: KProxy k)]

class Reflect (a :: k) where Source #

Class of types that can be reflected to values.

Methods

reflect :: Proxy (a :: k) -> Demote a Source #

Instances
KnownSymbol s => Reflect (s :: Symbol) Source # 
Instance details

Defined in Servant.GitHub.Webhook

Methods

reflect :: Proxy s -> Demote s Source #

Reflect () Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookWatchEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookTeamAddEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookStatusEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookReleaseEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPushEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPullRequestReviewCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPullRequestEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPublicEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPingEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookPageBuildEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookMemberEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookIssuesEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookIssueCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookInstallationRepositoriesEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookInstallationEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookGollumEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookForkEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeploymentStatusEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeploymentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookDeleteEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookCreateEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookCommitCommentEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect WebhookWildcardEvent Source # 
Instance details

Defined in Servant.GitHub.Webhook

Reflect ([] :: [k]) Source # 
Instance details

Defined in Servant.GitHub.Webhook

Methods

reflect :: Proxy [] -> Demote [] Source #

(Reflect x, Reflect xs) => Reflect (x ': xs :: [a]) Source # 
Instance details

Defined in Servant.GitHub.Webhook

Methods

reflect :: Proxy (x ': xs) -> Demote (x ': xs) Source #

Stringy stuff

parseHeaderMaybe :: FromHttpApiData a => ByteString -> Maybe a Source #

Helper that parses a header using a FromHttpApiData instance and discards the parse error message if any.

matchEvent :: RepoWebhookEvent -> ByteString -> Maybe RepoWebhookEvent Source #

Determines whether a given webhook event matches a given raw representation of one. The result is Nothing if there is no match. This function accounts for the WebhookWildcardEvent matching everything, so it returns the result of parsing the raw representation when trying to match against the wildcard.