DOH: Complete API bindings for DigitalOcean API V2

[ library, mit, network ] [ Propose Tags ]
Versions [RSS] 0.1.0.0, 0.1.1.0, 0.1.1.1, 0.1.2.0, 0.1.3.0, 0.1.4.0
Dependencies aeson, aeson-casing, base (>=4.9 && <4.10), bytestring, containers, filepath, http-client, http-client-tls, http-types, lens, mtl, text, time, unordered-containers, uri [details]
License MIT
Author Yiğit Özkavcı
Maintainer yigitozkavci8@gmail.com
Category Network
Source repo head: git clone https://github.com/inzva/DOH
Uploaded by yigitozkavci at 2017-08-01T20:40:27Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 4172 total (18 in the last 30 days)
Rating 2.0 (votes: 1) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2017-08-01 [all 1 reports]

Readme for DOH-0.1.1.1

[back to package description]

DOH

Complete API bindings for DigitalOcean API V2

Getting Started

Here is an example usage of the API:

{-# LANGUAGE OverloadedStrings #-}

module Main where

-----------------------------------------------------------------
import Network.DigitalOcean
import Network.DigitalOcean.Types
import Network.DigitalOcean.Services
-----------------------------------------------------------------
import Control.Monad.Except
import Control.Monad.Reader
-----------------------------------------------------------------

client :: Client
client = Client "your api key"

main :: IO ()
main = do
  result <- runExceptT $ (runReaderT $ runDO createViaSshKeys) client
  case result of
    Left err -> print err
    Right _ -> return ()

createViaSshKeys :: DO ()
createViaSshKeys = do
  -- Read a public key from a key pair and create ssh keys on DigitalOcean with it
  pubKey <- liftIO $ readFile "/Users/yigitozkavci/.ssh/do_api_rsa.pub"
  sshKey <- createSSHKey (SSHKeyPayload "my api key" pubKey) 
  
  -- Create 2 droplets with our newly uploaded ssh keys
  let dropletPayload = IDropletPayload "nyc3" "512mb" Ubuntu1404x64 (Just [sshkeyFingerprint sshKey]) Nothing Nothing Nothing Nothing Nothing Nothing Nothing
  droplets <- map dropletId <$> createDroplets ["droplet-1", "droplet-2"] dropletPayload

  -- Take snapshot of our newly created droplets
  forM_ droplets $ \dropletId -> performDropletAction dropletId (TakeSnapshot (Just "bulk snapshot"))

For full documentation and reference, see: http://hackage.haskell.org/package/DOH-0.1.1.0/docs/Network-DigitalOcean.html

Contributing

What can you do?

  • You can open an issue for unexpected / needed behaviors
  • Better, you can send a Pull Request

Any kind of contributions are welcome, even if it's updating docs / improving commenting / improving tests.