module Network.Haskoin.Util.Constants where
import Data.Word (Word8,Word32)
addrPrefix :: Word8
addrPrefix = 0
scriptPrefix :: Word8
scriptPrefix = 5
secretPrefix :: Word8
secretPrefix = 128
extPubKeyPrefix :: Word32
extPubKeyPrefix = 0x0488b21e
extSecretPrefix :: Word32
extSecretPrefix = 0x0488ade4
networkMagic :: Word32
networkMagic = 0xf9beb4d9
genesisHeader :: [Integer]
genesisHeader =
[ 0x01
, 0x00
, 0x3ba3edfd7a7b12b27ac72c3e67768f617fc81bc3888a51323a9fb8aa4b1e5e4a
, 1231006505
, 486604799
, 2083236893
]
maxBlockSize :: Int
maxBlockSize = 1000000
walletFile :: String
walletFile = "walletdb"
haskoinUserAgent :: String
haskoinUserAgent = "/haskoin:0.0.2/"