Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
Documentation
Instances
Eq PlainText Source # | |
Read PlainText Source # | |
Show PlainText Source # | |
Generic PlainText Source # | |
Arbitrary PlainText Source # | |
Binary PlainText Source # | |
MessagePack PlainText Source # | |
Defined in Network.Tox.Crypto.Box | |
type Rep PlainText Source # | |
Defined in Network.Tox.Crypto.Box type Rep PlainText = D1 ('MetaData "PlainText" "Network.Tox.Crypto.Box" "toxcore-0.2.11-inplace" 'True) (C1 ('MetaCons "PlainText" 'PrefixI 'True) (S1 ('MetaSel ('Just "unPlainText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))) |
data CipherText Source #
Instances
Eq CipherText Source # | |
Defined in Network.Tox.Crypto.Box (==) :: CipherText -> CipherText -> Bool # (/=) :: CipherText -> CipherText -> Bool # | |
Read CipherText Source # | |
Defined in Network.Tox.Crypto.Box readsPrec :: Int -> ReadS CipherText # readList :: ReadS [CipherText] # readPrec :: ReadPrec CipherText # readListPrec :: ReadPrec [CipherText] # | |
Show CipherText Source # | |
Defined in Network.Tox.Crypto.Box showsPrec :: Int -> CipherText -> ShowS # show :: CipherText -> String # showList :: [CipherText] -> ShowS # | |
Arbitrary CipherText Source # | |
Defined in Network.Tox.Crypto.Box arbitrary :: Gen CipherText # shrink :: CipherText -> [CipherText] # | |
Binary CipherText Source # | |
Defined in Network.Tox.Crypto.Box | |
MessagePack CipherText Source # | |
Defined in Network.Tox.Crypto.Box toObject :: CipherText -> Object # fromObject :: (Applicative m, Monad m, MonadFail m) => Object -> m CipherText # |
cipherText :: MonadFail m => ByteString -> m CipherText Source #
unCipherText :: CipherText -> ByteString Source #
decrypt :: CombinedKey -> Nonce -> CipherText -> Maybe PlainText Source #
encrypt :: CombinedKey -> Nonce -> PlainText -> CipherText Source #