Skip to content

Commit

Permalink
squash module names
Browse files Browse the repository at this point in the history
  • Loading branch information
fumieval committed Sep 20, 2020
1 parent b2df4dd commit 0baeeb8
Show file tree
Hide file tree
Showing 8 changed files with 24 additions and 24 deletions.
14 changes: 7 additions & 7 deletions src/Web/WebAuthn.hs → src/WebAuthn.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,15 +4,15 @@
{-# LANGUAGE ScopedTypeVariables #-}
-----------------------------------------------------------------------
-- |
-- Module : Web.WebAuthn
-- Module : WebAuthn
-- License : BSD3
--
-- Maintainer : Fumiaki Kinoshita <[email protected]>
--
-- <https://www.w3.org/TR/webauthn/ Web Authentication API> Verification library
-----------------------------------------------------------------------

module Web.WebAuthn (
module WebAuthn (
-- * Basic
TokenBinding(..)
, Origin(..)
Expand Down Expand Up @@ -53,11 +53,11 @@ import qualified Codec.CBOR.Decoding as CBOR
import qualified Codec.Serialise as CBOR
import Control.Monad.Fail

import Web.WebAuthn.Signature
import Web.WebAuthn.Types
import qualified Web.WebAuthn.TPM as TPM
import qualified Web.WebAuthn.FIDOU2F as U2F
import qualified Web.WebAuthn.Packed as Packed
import WebAuthn.Signature
import WebAuthn.Types
import qualified WebAuthn.TPM as TPM
import qualified WebAuthn.FIDOU2F as U2F
import qualified WebAuthn.Packed as Packed

-- | Generate a cryptographic challenge (13.1).
generateChallenge :: Int -> IO Challenge
Expand Down
4 changes: 2 additions & 2 deletions src/Web/WebAuthn/FIDOU2F.hs → src/WebAuthn/FIDOU2F.hs
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
module Web.WebAuthn.FIDOU2F where
module WebAuthn.FIDOU2F where

import Crypto.Hash
import Data.ByteString (ByteString)
Expand All @@ -12,7 +12,7 @@ import qualified Data.ByteArray as BA
import qualified Data.Map as Map
import qualified Data.X509 as X509
import qualified Data.X509.Validation as X509
import Web.WebAuthn.Types
import WebAuthn.Types

data Stmt = Stmt (X509.SignedExact X509.Certificate) ByteString
deriving Show
Expand Down
6 changes: 3 additions & 3 deletions src/Web/WebAuthn/Packed.hs → src/WebAuthn/Packed.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{-# LANGUAGE OverloadedStrings #-}
module Web.WebAuthn.Packed where
module WebAuthn.Packed where

import Crypto.Hash
import Data.ByteString (ByteString)
Expand All @@ -9,8 +9,8 @@ import qualified Data.X509.Validation as X509
import qualified Codec.CBOR.Term as CBOR
import qualified Codec.CBOR.Decoding as CBOR
import qualified Data.Map as Map
import Web.WebAuthn.Signature
import Web.WebAuthn.Types
import WebAuthn.Signature
import WebAuthn.Types

data Stmt = Stmt Int ByteString (Maybe (X509.SignedExact X509.Certificate))
deriving Show
Expand Down
4 changes: 2 additions & 2 deletions src/Web/WebAuthn/Signature.hs → src/WebAuthn/Signature.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{-# LANGUAGE OverloadedStrings #-}
module Web.WebAuthn.Signature (PublicKey(..)
module WebAuthn.Signature (PublicKey(..)
, parsePublicKey
, verifySig
) where
Expand All @@ -20,7 +20,7 @@ import qualified Data.Map as Map
import Data.ASN1.BinaryEncoding
import Data.ASN1.Encoding
import Data.ASN1.Types
import Web.WebAuthn.Types
import WebAuthn.Types

data PublicKey = PubEC EC.PublicKey | PubRSA RSA.PublicKey

Expand Down
4 changes: 2 additions & 2 deletions src/Web/WebAuthn/TPM.hs → src/WebAuthn/TPM.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
{-# LANGUAGE OverloadedStrings #-}
module Web.WebAuthn.TPM where
module WebAuthn.TPM where

import Data.ByteString (ByteString)
import Crypto.Hash (Digest, SHA256)
Expand All @@ -8,7 +8,7 @@ import qualified Data.X509.Validation as X509
import qualified Codec.CBOR.Term as CBOR
import qualified Codec.CBOR.Decoding as CBOR
import qualified Data.Map as Map
import Web.WebAuthn.Types (VerificationFailure(..), AuthenticatorData)
import WebAuthn.Types (VerificationFailure(..), AuthenticatorData)

data Stmt = Stmt Int ByteString (X509.SignedExact X509.Certificate) ByteString deriving Show

Expand Down
2 changes: 1 addition & 1 deletion src/Web/WebAuthn/Types.hs → src/WebAuthn/Types.hs
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE DeriveGeneric #-}
module Web.WebAuthn.Types (
module WebAuthn.Types (
-- * Relying party
RelyingParty(..)
, Origin(..)
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -19,7 +19,7 @@ module Network.Wai.Middleware.WebAuthn
import Control.Concurrent
import Control.Monad (forever)
import Crypto.Random (getRandomBytes)
import Web.WebAuthn as W
import WebAuthn as W
import qualified Data.Aeson as J
import Data.Text (Text)
import Data.Hashable (Hashable)
Expand Down
12 changes: 6 additions & 6 deletions webauthn.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -18,12 +18,12 @@ extra-source-files: CHANGELOG.md

library
exposed-modules:
Web.WebAuthn
Web.WebAuthn.Types
Web.WebAuthn.FIDOU2F
Web.WebAuthn.Packed
Web.WebAuthn.Signature
Web.WebAuthn.TPM
WebAuthn
WebAuthn.Types
WebAuthn.FIDOU2F
WebAuthn.Packed
WebAuthn.Signature
WebAuthn.TPM
build-depends: base == 4.*
, containers
, cryptonite
Expand Down

0 comments on commit 0baeeb8

Please sign in to comment.