module Botan.Low.PubKey.ECDH where

import Botan.Bindings.PubKey
import Botan.Bindings.PubKey.ECDH

import Botan.Low.MPI
import Botan.Low.Prelude
import Botan.Low.PubKey

privKeyLoadECDH
    :: MP           -- ^ __scalar__
    -> ByteString   -- ^ __curve_name__
    -> IO PrivKey   -- ^ __key__
privKeyLoadECDH :: MP -> ByteString -> IO PrivKey
privKeyLoadECDH = (Ptr BotanPrivKey
 -> BotanMP -> ConstPtr CChar -> IO BotanErrorCode)
-> MP -> ByteString -> IO PrivKey
mkPrivKeyLoad1_name Ptr BotanPrivKey -> BotanMP -> ConstPtr CChar -> IO BotanErrorCode
botan_privkey_load_ecdh

pubKeyLoadECDH
    :: MP           -- ^ __public_x__
    -> MP           -- ^ __public_y__
    -> ByteString   -- ^ __curve_name__
    -> IO PubKey    -- ^ __key__
pubKeyLoadECDH :: MP -> MP -> ByteString -> IO PubKey
pubKeyLoadECDH = (Ptr BotanPubKey
 -> BotanMP -> BotanMP -> ConstPtr CChar -> IO BotanErrorCode)
-> MP -> MP -> ByteString -> IO PubKey
mkPubKeyLoad2_name Ptr BotanPubKey
-> BotanMP -> BotanMP -> ConstPtr CChar -> IO BotanErrorCode
botan_pubkey_load_ecdh