slack-notify-haskell-0.2.3: Slack notifier for Haskell project.

Safe HaskellNone
LanguageHaskell2010

Network.Slack.Notifier

Description

This module sends notification to slack.

{-# LANGUAGE OverloadedStrings #-}
import Network.Slack.Notifier

main = do
  let config = defaultConfig { webhookurl = "https://hooks.slack.com/services/your/slack/webhookurl"
                             , channel = Just "#general"
                             , username = Just "haskell"
                             }
   notify config "Hello, World"
   return ()

Synopsis

Documentation

data Config Source

Configuration of notifying slack

notify :: Config -> Text -> IO (Either HttpException ()) Source

Notify text to slack. Throws exception when the request fail.