Copyright | 2015 Tebello Thejane |
---|---|
License | BSD3 |
Maintainer | Tebello Thejane <[email protected]> |
Stability | Experimental |
Portability | non-portable (GHC Extensions) |
Safe Haskell | None |
Language | Haskell2010 |
Network.Bitcoin.BitX.Public
Description
Usage example
As a small example, to get the current selling price of bitcoin on the BitX exchange, do the following:
{-# LANGUAGE DataKinds #-} import Control.Lens ((^.)) import Network.Bitcoin.BitX (BitXAPIResponse(..), getTicker, CcyPair(..)) import qualified Network.Bitcoin.BitX as BitX import Data.Text (unpack) import Network.HTTP.Types.Status (Status(..)) import Network.HTTP.Conduit (responseStatus) main :: IO () main = do bitXResponse <- getTicker XBTZAR case bitXResponse of ValidResponse tic -> print (tic ^. BitX.ask) ErrorResponse err -> error $ "BitX error received: \"" ++ unpack (err ^. BitX.error) ++ "\"" ExceptionResponse ex -> error $ "Exception was thrown: \"" ++ show ex ++ "\"" UnparseableResponse resp -> error $ "Bad HTTP response; HTTP status code was: \"" ++ (show . statusCode . responseStatus $ resp) ++ "\""
- getTicker :: CcyPair -> IO (BitXAPIResponse Ticker)
- getTickers :: IO (BitXAPIResponse [Ticker])
- getOrderBook :: CcyPair -> IO (BitXAPIResponse Orderbook)
- getTrades :: CcyPair -> IO (BitXAPIResponse [Trade])
Documentation
getTickers :: IO (BitXAPIResponse [Ticker]) Source
Returns the latest ticker indicators from all active BitX exchanges.
getOrderBook :: CcyPair -> IO (BitXAPIResponse Orderbook) Source
Returns a list of bids and asks in the order book.
Ask orders are sorted by price ascending. Bid orders are sorted by price descending. Note that multiple orders at the same price are not necessarily conflated.