bitcoin-payment-channel-1.2.0.0: Instant, two-party Bitcoin payments

Safe HaskellNone
LanguageHaskell2010

Bitcoin.SpendCond.Util

Synopsis

Documentation

getPrevIns :: SpendCondition r => Tx -> r -> [InputG P2SH r ()] Source #

Create inputs that redeem outputs paying to the given (P2SH) redeemScript

singlePrevIn :: (Show r, SpendCondition r) => Tx -> r -> Word32 -> Either (PickOutError r) (InputG P2SH r ()) Source #

data PickOutError r Source #

Instances

Eq r => Eq (PickOutError r) Source # 
SpendCondition r => Show (PickOutError r) Source # 
Generic (PickOutError r) Source # 

Associated Types

type Rep (PickOutError r) :: * -> * #

Methods

from :: PickOutError r -> Rep (PickOutError r) x #

to :: Rep (PickOutError r) x -> PickOutError r #

ToJSON r => ToJSON (PickOutError r) Source # 
FromJSON r => FromJSON (PickOutError r) Source # 
Serialize r => Serialize (PickOutError r) Source # 
NFData r => NFData (PickOutError r) Source # 

Methods

rnf :: PickOutError r -> () #

type Rep (PickOutError r) Source #