twilio-0.1.3.2: Twilio REST API library for Haskell

Safe HaskellNone
LanguageHaskell98

Twilio.APIKeys

Contents

Synopsis

Resource

get :: MonadThrow m => TwilioT m APIKeys Source #

Get APIKeys.

For example, you can fetch the APIKeys resource in the IO monad as follows:

module Main where

import Control.Monad.IO.Class (liftIO)
import System.Environment (getEnv)
import Twilio.APIKeys as APIKeys
import Twilio.Types

-- | Print API Keys.
main :: IO ()
main = runTwilio' (getEnv "ACCOUNT_SID")
                  (getEnv "AUTH_TOKEN")
     $ APIKeys.get >>= liftIO . print