stripe-core-2.0.2: Stripe API for Haskell - Pure Core

Copyright(c) David Johnson, 2014
Maintainerdjohnson.m@gmail.com
Stabilityexperimental
PortabilityPOSIX
Safe HaskellNone
LanguageHaskell2010

Web.Stripe.Customer

Contents

Description

https://stripe.com/docs/api#customers

{-# LANGUAGE OverloadedStrings #-}
import Web.Stripe
import Web.Stripe.Customer

main :: IO ()
main = do
  let config = StripeConfig (StripeKey "secret_key")
  result <- stripe config createCustomer
  case result of
    Right customer    -> print customer
    Left  stripeError -> print stripeError

Synopsis

API

getCustomer Source

Retrieve a customer

getCustomers :: StripeRequest GetCustomers Source

Retrieve up to 100 customers at a time

Types

newtype ExpandParams Source

Type of Expansion Parameters for use on Stripe objects

Constructors

ExpandParams 

Fields

getExpandParams :: [Text]
 

mkNewCard :: CardNumber -> ExpMonth -> ExpYear -> NewCard Source

create a NewCard with only the required fields

data StripeList a Source

Generic handling of Stripe JSON arrays

Constructors

StripeList 

Fields

list :: [a]
 
stripeUrl :: Text
 
object :: Text
 
totalCount :: Maybe Int
 
hasMore :: Bool
 

Instances