gdax-0.6.0.0: API Wrapping for Coinbase's GDAX exchange.

Safe HaskellNone
LanguageHaskell2010

Network.GDAX.Types.Private

Documentation

data Account Source #

data MarginAccount Source #

Instances

Show MarginAccount Source # 
Generic MarginAccount Source # 

Associated Types

type Rep MarginAccount :: * -> * #

type Rep MarginAccount Source # 
type Rep MarginAccount = D1 (MetaData "MarginAccount" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "MarginAccount" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_maccountFundedAmount") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)) (S1 (MetaSel (Just Symbol "_maccountDefaultAmount") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double))))

data NewLimitOrder Source #

Instances

Show NewLimitOrder Source # 
Generic NewLimitOrder Source # 

Associated Types

type Rep NewLimitOrder :: * -> * #

ToJSON NewLimitOrder Source # 
type Rep NewLimitOrder Source # 

data NewMarketOrder Source #

data NewStopOrder Source #

data MarketDesire Source #

Constructors

DesireSize Double

Desired amount in commodity (e.g. BTC)

DesireFunds Double

Desired amount in quote currency (e.g. USD)

data TimeInForce Source #

data SelfTradePolicy Source #

Instances

Eq SelfTradePolicy Source # 
Ord SelfTradePolicy Source # 
Show SelfTradePolicy Source # 
Generic SelfTradePolicy Source # 
ToJSON SelfTradePolicy Source # 
FromJSON SelfTradePolicy Source # 
type Rep SelfTradePolicy Source # 
type Rep SelfTradePolicy = D1 (MetaData "SelfTradePolicy" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) ((:+:) ((:+:) (C1 (MetaCons "DecreaseOrCancel" PrefixI False) U1) (C1 (MetaCons "CancelOldest" PrefixI False) U1)) ((:+:) (C1 (MetaCons "CancelNewest" PrefixI False) U1) (C1 (MetaCons "CancelBoth" PrefixI False) U1)))

data Order Source #

Instances

Show Order Source # 

Methods

showsPrec :: Int -> Order -> ShowS #

show :: Order -> String #

showList :: [Order] -> ShowS #

Generic Order Source # 

Associated Types

type Rep Order :: * -> * #

Methods

from :: Order -> Rep Order x #

to :: Rep Order x -> Order #

FromJSON Order Source # 
type Rep Order Source # 
type Rep Order = D1 (MetaData "Order" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "Order" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_orderId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 OrderId)) ((:*:) (S1 (MetaSel (Just Symbol "_orderPrice") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)) (S1 (MetaSel (Just Symbol "_orderSize") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_orderProductId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ProductId)) (S1 (MetaSel (Just Symbol "_orderSide") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Side))) ((:*:) (S1 (MetaSel (Just Symbol "_orderSelfTradePrevention") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 SelfTradePolicy)) (S1 (MetaSel (Just Symbol "_orderType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 OrderType))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_orderTimeInForce") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 TimeInForce)) (S1 (MetaSel (Just Symbol "_orderPostOnly") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_orderCreatedAt") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 UTCTime)) (S1 (MetaSel (Just Symbol "_orderFillFees") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_orderFilledSize") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)) (S1 (MetaSel (Just Symbol "_orderExecutedValue") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double))) ((:*:) (S1 (MetaSel (Just Symbol "_orderStatus") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 OrderStatus)) (S1 (MetaSel (Just Symbol "_orderSettled") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)))))))

data Fill Source #

Instances

Show Fill Source # 

Methods

showsPrec :: Int -> Fill -> ShowS #

show :: Fill -> String #

showList :: [Fill] -> ShowS #

Generic Fill Source # 

Associated Types

type Rep Fill :: * -> * #

Methods

from :: Fill -> Rep Fill x #

to :: Rep Fill x -> Fill #

FromJSON Fill Source # 
type Rep Fill Source # 

data Funding Source #

Instances

Show Funding Source # 
Generic Funding Source # 

Associated Types

type Rep Funding :: * -> * #

Methods

from :: Funding -> Rep Funding x #

to :: Rep Funding x -> Funding #

FromJSON Funding Source # 
type Rep Funding Source # 

data MarginTransfer Source #

Instances

Show MarginTransfer Source # 
Generic MarginTransfer Source # 

Associated Types

type Rep MarginTransfer :: * -> * #

FromJSON MarginTransfer Source # 
type Rep MarginTransfer Source # 
type Rep MarginTransfer = D1 (MetaData "MarginTransfer" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "MarginTransfer" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_mtCreatedAt") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 UTCTime)) ((:*:) (S1 (MetaSel (Just Symbol "_mtId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 MarginTransferId)) (S1 (MetaSel (Just Symbol "_mtUserId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 UserId)))) ((:*:) (S1 (MetaSel (Just Symbol "_mtProfileId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ProfileId)) ((:*:) (S1 (MetaSel (Just Symbol "_mtMarginProfileId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ProfileId)) (S1 (MetaSel (Just Symbol "_mtType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 MarginType))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_mtAmount") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Double)) ((:*:) (S1 (MetaSel (Just Symbol "_mtCurrency") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 CurrencyId)) (S1 (MetaSel (Just Symbol "_mtAccountId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 AccountId)))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_mtMarginAccountId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 AccountId)) (S1 (MetaSel (Just Symbol "_mtMarginProductId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ProductId))) ((:*:) (S1 (MetaSel (Just Symbol "_mtStatus") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 MarginStatus)) (S1 (MetaSel (Just Symbol "_mtNonce") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Int64)))))))

data Position Source #

Instances

Show Position Source # 
Generic Position Source # 

Associated Types

type Rep Position :: * -> * #

Methods

from :: Position -> Rep Position x #

to :: Rep Position x -> Position #

FromJSON Position Source # 
type Rep Position Source # 

data OutstandingFunding Source #

data PositionAccount Source #

data PaymentMethod Source #

Instances

Show PaymentMethod Source # 
Generic PaymentMethod Source # 

Associated Types

type Rep PaymentMethod :: * -> * #

FromJSON PaymentMethod Source # 
type Rep PaymentMethod Source # 
type Rep PaymentMethod = D1 (MetaData "PaymentMethod" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "PaymentMethod" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_pmethId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 PaymentMethodId)) (S1 (MetaSel (Just Symbol "_pmethType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 PaymentMethodType))) ((:*:) (S1 (MetaSel (Just Symbol "_pmethName") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text)) ((:*:) (S1 (MetaSel (Just Symbol "_pmethCurrency") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 CurrencyId)) (S1 (MetaSel (Just Symbol "_pmethPrimaryBuy") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_pmethPrimarySell") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)) ((:*:) (S1 (MetaSel (Just Symbol "_pmethAllowBuy") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)) (S1 (MetaSel (Just Symbol "_pmethAllowSell") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)))) ((:*:) (S1 (MetaSel (Just Symbol "_pmethAllowDeposit") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)) ((:*:) (S1 (MetaSel (Just Symbol "_pmethAllowWithdraw") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Bool)) (S1 (MetaSel (Just Symbol "_pmethLimits") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Limits)))))))

data Limit Source #

Instances

Show Limit Source # 

Methods

showsPrec :: Int -> Limit -> ShowS #

show :: Limit -> String #

showList :: [Limit] -> ShowS #

Generic Limit Source # 

Associated Types

type Rep Limit :: * -> * #

Methods

from :: Limit -> Rep Limit x #

to :: Rep Limit x -> Limit #

FromJSON Limit Source # 
type Rep Limit Source # 
type Rep Limit = D1 (MetaData "Limit" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "Limit" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_limitPeriodInDays") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word)) ((:*:) (S1 (MetaSel (Just Symbol "_limitTotal") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 LimitValue)) (S1 (MetaSel (Just Symbol "_limitRemaining") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 LimitValue)))))

data LimitValue Source #

Instances

data CoinbaseAccount Source #

Instances

Show CoinbaseAccount Source # 
Generic CoinbaseAccount Source # 
FromJSON CoinbaseAccount Source # 
type Rep CoinbaseAccount Source # 

data WireDepositInfo Source #

Instances

Show WireDepositInfo Source # 
Generic WireDepositInfo Source # 
FromJSON WireDepositInfo Source # 
type Rep WireDepositInfo Source # 

data Country Source #

Constructors

Country 

Instances

Show Country Source # 
Generic Country Source # 

Associated Types

type Rep Country :: * -> * #

Methods

from :: Country -> Rep Country x #

to :: Rep Country x -> Country #

FromJSON Country Source # 
type Rep Country Source # 
type Rep Country = D1 (MetaData "Country" "Network.GDAX.Types.Private" "gdax-0.6.0.0-F40861Q8gvHAPG8RopSKgw" False) (C1 (MetaCons "Country" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_countryCode") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_countryName") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text))))

data SepaDepositInfo Source #

Instances

Show SepaDepositInfo Source # 
Generic SepaDepositInfo Source # 
FromJSON SepaDepositInfo Source # 
type Rep SepaDepositInfo Source # 

data Report Source #

Instances

Show Report Source # 
Generic Report Source # 

Associated Types

type Rep Report :: * -> * #

Methods

from :: Report -> Rep Report x #

to :: Rep Report x -> Report #

FromJSON Report Source # 
type Rep Report Source #