@@ -158,8 +158,8 @@ module Sel.Hashing.Short where
158
158
shortHashToHexText :: ShortHash -> Data.Text.Internal.Text
159
159
160
160
module Sel.PublicKey.Cipher where
161
- type CipherText :: *
162
- data CipherText = CipherText {messageLength :: Foreign.C.Types.CULLong, cipherTextForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
161
+ type Ciphertext :: *
162
+ data Ciphertext = Ciphertext {messageLength :: Foreign.C.Types.CULLong, ciphertextForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
163
163
type EncryptionError :: *
164
164
data EncryptionError = EncryptionError
165
165
type KeyPairGenerationException :: *
@@ -170,12 +170,12 @@ module Sel.PublicKey.Cipher where
170
170
newtype PublicKey = PublicKey (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
171
171
type SecretKey :: *
172
172
newtype SecretKey = SecretKey (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
173
- cipherTextFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text CipherText
174
- cipherTextToBinary :: CipherText -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
175
- cipherTextToHexByteString :: CipherText -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
176
- cipherTextToHexText :: CipherText -> Data.Text.Internal.Text
177
- decrypt :: CipherText -> PublicKey -> SecretKey -> Nonce -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
178
- encrypt :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> PublicKey -> SecretKey -> GHC.Types.IO (Nonce, CipherText )
173
+ ciphertextFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Ciphertext
174
+ ciphertextToBinary :: Ciphertext -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
175
+ ciphertextToHexByteString :: Ciphertext -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
176
+ ciphertextToHexText :: Ciphertext -> Data.Text.Internal.Text
177
+ decrypt :: Ciphertext -> PublicKey -> SecretKey -> Nonce -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
178
+ encrypt :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> PublicKey -> SecretKey -> GHC.Types.IO (Nonce, Ciphertext )
179
179
keyPairFromHexByteStrings :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text (PublicKey, SecretKey)
180
180
newKeyPair :: GHC.Types.IO (PublicKey, SecretKey)
181
181
nonceFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Nonce
@@ -193,8 +193,8 @@ module Sel.PublicKey.Seal where
193
193
type SecretKey :: *
194
194
newtype SecretKey = SecretKey (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
195
195
newKeyPair :: GHC.Types.IO (PublicKey, SecretKey)
196
- open :: Sel.PublicKey.Cipher.CipherText -> PublicKey -> SecretKey -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
197
- seal :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> PublicKey -> GHC.Types.IO Sel.PublicKey.Cipher.CipherText
196
+ open :: Sel.PublicKey.Cipher.Ciphertext -> PublicKey -> SecretKey -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
197
+ seal :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> PublicKey -> GHC.Types.IO Sel.PublicKey.Cipher.Ciphertext
198
198
199
199
module Sel.PublicKey.Signature where
200
200
type PublicKey :: *
@@ -234,27 +234,27 @@ module Sel.SecretKey.Authentication where
234
234
verify :: AuthenticationTag -> AuthenticationKey -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> GHC.Types.Bool
235
235
236
236
module Sel.SecretKey.Cipher where
237
- type Hash :: *
238
- data Hash = Sel.SecretKey.Cipher.Hash {Sel.SecretKey.Cipher.messageLength :: Foreign.C.Types.CULLong, Sel.SecretKey.Cipher.hashForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
237
+ type Ciphertext :: *
238
+ data Ciphertext = Sel.SecretKey.Cipher.Ciphertext {Sel.SecretKey.Cipher.messageLength :: Foreign.C.Types.CULLong, Sel.SecretKey.Cipher.ciphertextForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
239
239
type Nonce :: *
240
240
newtype Nonce = Sel.SecretKey.Cipher.Nonce (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
241
241
type SecretKey :: *
242
242
newtype SecretKey = Sel.SecretKey.Cipher.SecretKey (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
243
- decrypt :: Hash -> SecretKey -> Nonce -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
244
- encrypt :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> SecretKey -> GHC.Types.IO (Nonce, Hash)
245
- hashFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Hash
246
- hashToBinary :: Hash -> bytestring-0.11.5.3: Data.ByteString .Internal.Type.StrictByteString
247
- hashToHexByteString :: Hash -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
248
- hashToHexText :: Hash -> Data.Text .Internal.Text
243
+ ciphertextFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Ciphertext
244
+ ciphertextToBinary :: Ciphertext -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
245
+ ciphertextToHexByteString :: Ciphertext -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
246
+ ciphertextToHexText :: Ciphertext -> Data.Text .Internal.Text
247
+ decrypt :: Ciphertext -> SecretKey -> Nonce -> GHC.Maybe.Maybe bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
248
+ encrypt :: bytestring-0.11.5.3: Data.ByteString .Internal.Type.StrictByteString -> SecretKey -> GHC.Types.IO (Nonce, Ciphertext)
249
249
newSecretKey :: GHC.Types.IO SecretKey
250
250
nonceFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Nonce
251
251
nonceToHexByteString :: Nonce -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
252
252
secretKeyFromHexByteString :: bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text SecretKey
253
253
unsafeSecretKeyToHexByteString :: SecretKey -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
254
254
255
255
module Sel.SecretKey.Stream where
256
- type CipherText :: *
257
- data CipherText = Sel.SecretKey.Stream.CipherText {Sel.SecretKey.Stream.messageLength :: Foreign.C.Types.CULLong, Sel.SecretKey.Stream.cipherTextForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
256
+ type Ciphertext :: *
257
+ data Ciphertext = Sel.SecretKey.Stream.Ciphertext {Sel.SecretKey.Stream.messageLength :: Foreign.C.Types.CULLong, Sel.SecretKey.Stream.ciphertextForeignPtr :: GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar}
258
258
type Header :: *
259
259
newtype Header = Sel.SecretKey.Stream.Header (GHC.ForeignPtr.ForeignPtr Foreign.C.Types.CUChar)
260
260
type MessageTag :: *
@@ -270,15 +270,15 @@ module Sel.SecretKey.Stream where
270
270
data StreamEncryptionException = Sel.SecretKey.Stream.StreamEncryptionException
271
271
type StreamInitEncryptionException :: *
272
272
data StreamInitEncryptionException = Sel.SecretKey.Stream.StreamInitEncryptionException
273
- ciphertextFromHexByteString :: base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text CipherText
274
- ciphertextToBinary :: CipherText -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
275
- ciphertextToHexByteString :: CipherText -> base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
276
- ciphertextToHexText :: CipherText -> base16-1.0:Data.Base16.Types.Internal.Base16 Data.Text.Internal.Text
277
- decryptChunk :: forall (m :: * -> *) s. Control.Monad.IO.Class.MonadIO m => Multipart s -> CipherText -> m bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
278
- decryptList :: forall (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> Header -> [CipherText ] -> m (GHC.Maybe.Maybe [bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString])
273
+ ciphertextFromHexByteString :: base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Ciphertext
274
+ ciphertextToBinary :: Ciphertext -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
275
+ ciphertextToHexByteString :: Ciphertext -> base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
276
+ ciphertextToHexText :: Ciphertext -> base16-1.0:Data.Base16.Types.Internal.Base16 Data.Text.Internal.Text
277
+ decryptChunk :: forall (m :: * -> *) s. Control.Monad.IO.Class.MonadIO m => Multipart s -> Ciphertext -> m bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
278
+ decryptList :: forall (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> Header -> [Ciphertext ] -> m (GHC.Maybe.Maybe [bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString])
279
279
decryptStream :: forall a (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> Header -> (forall s. Multipart s -> m a) -> m (GHC.Maybe.Maybe a)
280
- encryptChunk :: forall (m :: * -> *) s. Control.Monad.IO.Class.MonadIO m => Multipart s -> MessageTag -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> m CipherText
281
- encryptList :: forall (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> [bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString] -> m (Header, [CipherText ])
280
+ encryptChunk :: forall (m :: * -> *) s. Control.Monad.IO.Class.MonadIO m => Multipart s -> MessageTag -> bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> m Ciphertext
281
+ encryptList :: forall (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> [bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString] -> m (Header, [Ciphertext ])
282
282
encryptStream :: forall a (m :: * -> *). Control.Monad.IO.Class.MonadIO m => SecretKey -> (forall s. Multipart s -> m a) -> m (Header, a)
283
283
headerFromHexByteString :: base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString -> Data.Either.Either Data.Text.Internal.Text Header
284
284
headerToHexByteString :: Header -> base16-1.0:Data.Base16.Types.Internal.Base16 bytestring-0.11.5.3:Data.ByteString.Internal.Type.StrictByteString
@@ -312,7 +312,7 @@ instance GHC.Show.Show Sel.Hashing.SHA512.Hash -- Defined in ‘Sel.Hashing.SHA5
312
312
instance GHC.Show.Show Sel.Hashing.Short.ShortHash -- Defined in ‘Sel.Hashing.Short’
313
313
instance GHC.Show.Show Sel.Hashing.Short.ShortHashKey -- Defined in ‘Sel.Hashing.Short’
314
314
instance GHC.Show.Show Sel.Hashing.Short.ShortHashingException -- Defined in ‘Sel.Hashing.Short’
315
- instance GHC.Show.Show Sel.PublicKey.Cipher.CipherText -- Defined in ‘Sel.PublicKey.Cipher’
315
+ instance GHC.Show.Show Sel.PublicKey.Cipher.Ciphertext -- Defined in ‘Sel.PublicKey.Cipher’
316
316
instance GHC.Show.Show Sel.PublicKey.Cipher.EncryptionError -- Defined in ‘Sel.PublicKey.Cipher’
317
317
instance GHC.Show.Show Sel.PublicKey.Cipher.KeyPairGenerationException -- Defined in ‘Sel.PublicKey.Cipher’
318
318
instance GHC.Show.Show Sel.PublicKey.Cipher.Nonce -- Defined in ‘Sel.PublicKey.Cipher’
@@ -321,10 +321,10 @@ instance GHC.Show.Show Sel.PublicKey.Cipher.SecretKey -- Defined in ‘Sel.Publi
321
321
instance GHC.Show.Show Sel.Scrypt.ScryptHash -- Defined in ‘Sel.Scrypt’
322
322
instance GHC.Show.Show Sel.SecretKey.Authentication.AuthenticationKey -- Defined in ‘Sel.SecretKey.Authentication’
323
323
instance GHC.Show.Show Sel.SecretKey.Authentication.AuthenticationTag -- Defined in ‘Sel.SecretKey.Authentication’
324
- instance GHC.Show.Show Sel.SecretKey.Cipher.Hash -- Defined in ‘Sel.SecretKey.Cipher’
324
+ instance GHC.Show.Show Sel.SecretKey.Cipher.Ciphertext -- Defined in ‘Sel.SecretKey.Cipher’
325
325
instance GHC.Show.Show Sel.SecretKey.Cipher.Nonce -- Defined in ‘Sel.SecretKey.Cipher’
326
326
instance GHC.Show.Show Sel.SecretKey.Cipher.SecretKey -- Defined in ‘Sel.SecretKey.Cipher’
327
- instance GHC.Show.Show Sel.SecretKey.Stream.CipherText -- Defined in ‘Sel.SecretKey.Stream’
327
+ instance GHC.Show.Show Sel.SecretKey.Stream.Ciphertext -- Defined in ‘Sel.SecretKey.Stream’
328
328
instance GHC.Show.Show Sel.SecretKey.Stream.Header -- Defined in ‘Sel.SecretKey.Stream’
329
329
instance GHC.Show.Show Sel.SecretKey.Stream.SecretKey -- Defined in ‘Sel.SecretKey.Stream’
330
330
instance GHC.Show.Show Sel.SecretKey.Stream.StreamDecryptionException -- Defined in ‘Sel.SecretKey.Stream’
@@ -345,7 +345,7 @@ instance GHC.Classes.Eq Sel.Hashing.SHA512.Hash -- Defined in ‘Sel.Hashing.SHA
345
345
instance GHC.Classes.Eq Sel.Hashing.Short.ShortHash -- Defined in ‘Sel.Hashing.Short’
346
346
instance GHC.Classes.Eq Sel.Hashing.Short.ShortHashKey -- Defined in ‘Sel.Hashing.Short’
347
347
instance GHC.Classes.Eq Sel.Hashing.Short.ShortHashingException -- Defined in ‘Sel.Hashing.Short’
348
- instance GHC.Classes.Eq Sel.PublicKey.Cipher.CipherText -- Defined in ‘Sel.PublicKey.Cipher’
348
+ instance GHC.Classes.Eq Sel.PublicKey.Cipher.Ciphertext -- Defined in ‘Sel.PublicKey.Cipher’
349
349
instance GHC.Classes.Eq Sel.PublicKey.Cipher.EncryptionError -- Defined in ‘Sel.PublicKey.Cipher’
350
350
instance GHC.Classes.Eq Sel.PublicKey.Cipher.KeyPairGenerationException -- Defined in ‘Sel.PublicKey.Cipher’
351
351
instance GHC.Classes.Eq Sel.PublicKey.Cipher.Nonce -- Defined in ‘Sel.PublicKey.Cipher’
@@ -357,10 +357,10 @@ instance GHC.Classes.Eq Sel.PublicKey.Signature.SignedMessage -- Defined in ‘S
357
357
instance GHC.Classes.Eq Sel.Scrypt.ScryptHash -- Defined in ‘Sel.Scrypt’
358
358
instance GHC.Classes.Eq Sel.SecretKey.Authentication.AuthenticationKey -- Defined in ‘Sel.SecretKey.Authentication’
359
359
instance GHC.Classes.Eq Sel.SecretKey.Authentication.AuthenticationTag -- Defined in ‘Sel.SecretKey.Authentication’
360
- instance GHC.Classes.Eq Sel.SecretKey.Cipher.Hash -- Defined in ‘Sel.SecretKey.Cipher’
360
+ instance GHC.Classes.Eq Sel.SecretKey.Cipher.Ciphertext -- Defined in ‘Sel.SecretKey.Cipher’
361
361
instance GHC.Classes.Eq Sel.SecretKey.Cipher.Nonce -- Defined in ‘Sel.SecretKey.Cipher’
362
362
instance GHC.Classes.Eq Sel.SecretKey.Cipher.SecretKey -- Defined in ‘Sel.SecretKey.Cipher’
363
- instance GHC.Classes.Eq Sel.SecretKey.Stream.CipherText -- Defined in ‘Sel.SecretKey.Stream’
363
+ instance GHC.Classes.Eq Sel.SecretKey.Stream.Ciphertext -- Defined in ‘Sel.SecretKey.Stream’
364
364
instance GHC.Classes.Eq Sel.SecretKey.Stream.Header -- Defined in ‘Sel.SecretKey.Stream’
365
365
instance GHC.Classes.Eq Sel.SecretKey.Stream.SecretKey -- Defined in ‘Sel.SecretKey.Stream’
366
366
instance GHC.Classes.Eq Sel.SecretKey.Stream.StreamDecryptionException -- Defined in ‘Sel.SecretKey.Stream’
@@ -381,7 +381,7 @@ instance GHC.Classes.Ord Sel.Hashing.SHA512.Hash -- Defined in ‘Sel.Hashing.SH
381
381
instance GHC.Classes.Ord Sel.Hashing.Short.ShortHash -- Defined in ‘Sel.Hashing.Short’
382
382
instance GHC.Classes.Ord Sel.Hashing.Short.ShortHashKey -- Defined in ‘Sel.Hashing.Short’
383
383
instance GHC.Classes.Ord Sel.Hashing.Short.ShortHashingException -- Defined in ‘Sel.Hashing.Short’
384
- instance GHC.Classes.Ord Sel.PublicKey.Cipher.CipherText -- Defined in ‘Sel.PublicKey.Cipher’
384
+ instance GHC.Classes.Ord Sel.PublicKey.Cipher.Ciphertext -- Defined in ‘Sel.PublicKey.Cipher’
385
385
instance GHC.Classes.Ord Sel.PublicKey.Cipher.EncryptionError -- Defined in ‘Sel.PublicKey.Cipher’
386
386
instance GHC.Classes.Ord Sel.PublicKey.Cipher.KeyPairGenerationException -- Defined in ‘Sel.PublicKey.Cipher’
387
387
instance GHC.Classes.Ord Sel.PublicKey.Cipher.Nonce -- Defined in ‘Sel.PublicKey.Cipher’
@@ -393,10 +393,10 @@ instance GHC.Classes.Ord Sel.PublicKey.Signature.SignedMessage -- Defined in ‘
393
393
instance GHC.Classes.Ord Sel.Scrypt.ScryptHash -- Defined in ‘Sel.Scrypt’
394
394
instance GHC.Classes.Ord Sel.SecretKey.Authentication.AuthenticationKey -- Defined in ‘Sel.SecretKey.Authentication’
395
395
instance GHC.Classes.Ord Sel.SecretKey.Authentication.AuthenticationTag -- Defined in ‘Sel.SecretKey.Authentication’
396
- instance GHC.Classes.Ord Sel.SecretKey.Cipher.Hash -- Defined in ‘Sel.SecretKey.Cipher’
396
+ instance GHC.Classes.Ord Sel.SecretKey.Cipher.Ciphertext -- Defined in ‘Sel.SecretKey.Cipher’
397
397
instance GHC.Classes.Ord Sel.SecretKey.Cipher.Nonce -- Defined in ‘Sel.SecretKey.Cipher’
398
398
instance GHC.Classes.Ord Sel.SecretKey.Cipher.SecretKey -- Defined in ‘Sel.SecretKey.Cipher’
399
- instance GHC.Classes.Ord Sel.SecretKey.Stream.CipherText -- Defined in ‘Sel.SecretKey.Stream’
399
+ instance GHC.Classes.Ord Sel.SecretKey.Stream.Ciphertext -- Defined in ‘Sel.SecretKey.Stream’
400
400
instance GHC.Classes.Ord Sel.SecretKey.Stream.Header -- Defined in ‘Sel.SecretKey.Stream’
401
401
instance GHC.Classes.Ord Sel.SecretKey.Stream.SecretKey -- Defined in ‘Sel.SecretKey.Stream’
402
402
instance GHC.Classes.Ord Sel.SecretKey.Stream.StreamDecryptionException -- Defined in ‘Sel.SecretKey.Stream’
@@ -416,16 +416,16 @@ instance Data.Text.Display.Core.Display Sel.Hashing.SHA512.Hash -- Defined in
416
416
instance Data.Text.Display.Core.Display Sel.Hashing.Short.ShortHash -- Defined in ‘Sel.Hashing.Short’
417
417
instance Data.Text.Display.Core.Display Sel.Hashing.Short.ShortHashKey -- Defined in ‘Sel.Hashing.Short’
418
418
instance Data.Text.Display.Core.Display Sel.Hashing.Short.ShortHashingException -- Defined in ‘Sel.Hashing.Short’
419
- instance Data.Text.Display.Core.Display Sel.PublicKey.Cipher.CipherText -- Defined in ‘Sel.PublicKey.Cipher’
419
+ instance Data.Text.Display.Core.Display Sel.PublicKey.Cipher.Ciphertext -- Defined in ‘Sel.PublicKey.Cipher’
420
420
instance Data.Text.Display.Core.Display Sel.PublicKey.Cipher.Nonce -- Defined in ‘Sel.PublicKey.Cipher’
421
421
instance Data.Text.Display.Core.Display Sel.PublicKey.Cipher.PublicKey -- Defined in ‘Sel.PublicKey.Cipher’
422
422
instance Data.Text.Display.Core.Display Sel.PublicKey.Cipher.SecretKey -- Defined in ‘Sel.PublicKey.Cipher’
423
423
instance Data.Text.Display.Core.Display Sel.Scrypt.ScryptHash -- Defined in ‘Sel.Scrypt’
424
424
instance Data.Text.Display.Core.Display Sel.SecretKey.Authentication.AuthenticationKey -- Defined in ‘Sel.SecretKey.Authentication’
425
425
instance Data.Text.Display.Core.Display Sel.SecretKey.Authentication.AuthenticationTag -- Defined in ‘Sel.SecretKey.Authentication’
426
- instance Data.Text.Display.Core.Display Sel.SecretKey.Cipher.Hash -- Defined in ‘Sel.SecretKey.Cipher’
426
+ instance Data.Text.Display.Core.Display Sel.SecretKey.Cipher.Ciphertext -- Defined in ‘Sel.SecretKey.Cipher’
427
427
instance Data.Text.Display.Core.Display Sel.SecretKey.Cipher.Nonce -- Defined in ‘Sel.SecretKey.Cipher’
428
428
instance Data.Text.Display.Core.Display Sel.SecretKey.Cipher.SecretKey -- Defined in ‘Sel.SecretKey.Cipher’
429
- instance Data.Text.Display.Core.Display Sel.SecretKey.Stream.CipherText -- Defined in ‘Sel.SecretKey.Stream’
429
+ instance Data.Text.Display.Core.Display Sel.SecretKey.Stream.Ciphertext -- Defined in ‘Sel.SecretKey.Stream’
430
430
instance Data.Text.Display.Core.Display Sel.SecretKey.Stream.Header -- Defined in ‘Sel.SecretKey.Stream’
431
431
instance Data.Text.Display.Core.Display Sel.SecretKey.Stream.SecretKey -- Defined in ‘Sel.SecretKey.Stream’
0 commit comments