| License | MIT |
|---|---|
| Maintainer | Stefan Saasen <stefan@saasen.me> |
| Stability | experimental |
| Safe Haskell | None |
| Language | Haskell2010 |
Web.JWT
Contents
Description
This implementation of JWT is based on https://tools.ietf.org/html/rfc7519 but currently only implements the minimum required to work with the Atlassian Connect framework.
Known limitations:
Synopsis
- decode :: JSON -> Maybe (JWT UnverifiedJWT)
- verify :: Secret -> JWT UnverifiedJWT -> Maybe (JWT VerifiedJWT)
- decodeAndVerifySignature :: Secret -> JSON -> Maybe (JWT VerifiedJWT)
- encodeSigned :: Algorithm -> Secret -> JWTClaimsSet -> JSON
- encodeUnsigned :: JWTClaimsSet -> JSON
- tokenIssuer :: JSON -> Maybe StringOrURI
- secret :: Text -> Secret
- binarySecret :: ByteString -> Secret
- claims :: JWT r -> JWTClaimsSet
- header :: JWT r -> JOSEHeader
- signature :: JWT r -> Maybe Signature
- auds :: JWTClaimsSet -> [StringOrURI]
- intDate :: NominalDiffTime -> Maybe IntDate
- numericDate :: NominalDiffTime -> Maybe NumericDate
- stringOrURI :: Text -> Maybe StringOrURI
- stringOrURIToText :: StringOrURI -> Text
- secondsSinceEpoch :: NumericDate -> NominalDiffTime
- typ :: JOSEHeader -> Maybe Text
- cty :: JOSEHeader -> Maybe Text
- alg :: JOSEHeader -> Maybe Algorithm
- data UnverifiedJWT
- data VerifiedJWT
- data Signature
- data Secret
- data JWT r
- type JSON = Text
- data Algorithm = HS256
- data JWTClaimsSet = JWTClaimsSet {
- iss :: Maybe StringOrURI
- sub :: Maybe StringOrURI
- aud :: Maybe (Either StringOrURI [StringOrURI])
- exp :: Maybe IntDate
- nbf :: Maybe IntDate
- iat :: Maybe IntDate
- jti :: Maybe StringOrURI
- unregisteredClaims :: ClaimsMap
- type ClaimsMap = Map Text Value
- type IntDate = NumericDate
- data NumericDate
- data StringOrURI
- type JWTHeader = JOSEHeader
- data JOSEHeader
- module Data.Default
Encoding & Decoding JWTs
Decoding
There are three use cases supported by the set of decoding/verification functions:
- Unsecured JWTs (http://tools.ietf.org/html/draft-ietf-oauth-json-web-token-30#section-6).
This is supported by the decode function
decode. As a client you don't care about signing or encrypting so you only get back aJWTUnverifiedJWT. I.e. the type makes it clear that no signature verification was attempted. - Signed JWTs you want to verify using a known secret.
This is what
decodeAndVerifySignaturesupports, given a secret and JSON it will return aJWTVerifiedJWTif the signature can be verified. - Signed JWTs that need to be verified using a secret that depends on
information contained in the JWT. E.g. the secret depends on
some claim, therefore the JWT needs to be decoded first and after
retrieving the appropriate secret value, verified in a subsequent step.
This is supported by using the
verifyfunction which given aJWTUnverifiedJWTand a secret will return aJWTVerifiedJWTiff the signature can be verified.
decode :: JSON -> Maybe (JWT UnverifiedJWT) Source #
Decode a claims set without verifying the signature. This is useful if information from the claim set is required in order to verify the claim (e.g. the secret needs to be retrieved based on unverified information from the claims set).
>>>:{let input = "eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJzb21lIjoicGF5bG9hZCJ9.Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U" :: T.Text mJwt = decode input in fmap header mJwt :} Just (JOSEHeader {typ = Just "JWT", cty = Nothing, alg = Just HS256})
and
>>>:{let input = "eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJzb21lIjoicGF5bG9hZCJ9.Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U" :: T.Text mJwt = decode input in fmap claims mJwt :} Just (JWTClaimsSet {iss = Nothing, sub = Nothing, aud = Nothing, exp = Nothing, nbf = Nothing, iat = Nothing, jti = Nothing, unregisteredClaims = fromList [("some",String "payload")]})
verify :: Secret -> JWT UnverifiedJWT -> Maybe (JWT VerifiedJWT) Source #
Using a known secret and a decoded claims set verify that the signature is correct and return a verified JWT token as a result.
This will return a VerifiedJWT if and only if the signature can be verified using the given secret.
The separation between decode and verify is very useful if you are communicating with
multiple different services with different secrets and it allows you to lookup the
correct secret for the unverified JWT before trying to verify it. If this is not an
isuse for you (there will only ever be one secret) then you should just use
decodeAndVerifySignature .
>>>:{let input = "eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJzb21lIjoicGF5bG9hZCJ9.Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U" :: T.Text mUnverifiedJwt = decode input mVerifiedJwt = verify (secret "secret") =<< mUnverifiedJwt in signature =<< mVerifiedJwt :} Just (Signature "Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U")
decodeAndVerifySignature :: Secret -> JSON -> Maybe (JWT VerifiedJWT) Source #
Decode a claims set and verify that the signature matches by using the supplied secret. The algorithm is based on the supplied header value.
This will return a VerifiedJWT if and only if the signature can be verified using the given secret.
>>>:{let input = "eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJzb21lIjoicGF5bG9hZCJ9.Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U" :: T.Text mJwt = decodeAndVerifySignature (secret "secret") input in signature =<< mJwt :} Just (Signature "Joh1R2dYzkRvDkqv3sygm5YyK8Gi4ShZqbhK2gxcs2U")
Encoding
encodeSigned :: Algorithm -> Secret -> JWTClaimsSet -> JSON Source #
Encode a claims set using the given secret
let
cs = def { -- def returns a default JWTClaimsSet
iss = stringOrURI Foo
, unregisteredClaims = Map.fromList [("http://example.com/is_root", (Bool True))]
}
key = secret "secret-key"
in encodeSigned HS256 key cs
"eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJodHRwOi8vZXhhbXBsZS5jb20vaXNfcm9vdCI6dHJ1ZSwiaXNzIjoiRm9vIn0.vHQHuG3ujbnBUmEp-fSUtYxk27rLiP2hrNhxpyWhb2E"
encodeUnsigned :: JWTClaimsSet -> JSON Source #
Encode a claims set without signing it
let
cs = def { -- def returns a default JWTClaimsSet
iss = stringOrURI Foo
, iat = numericDate 1394700934
, unregisteredClaims = Map.fromList [("http://example.com/is_root", (Bool True))]
}
in encodeUnsigned cs
"eyJ0eXAiOiJKV1QiLCJhbGciOiJIUzI1NiJ9.eyJpYXQiOjEzOTQ3MDA5MzQsImh0dHA6Ly9leGFtcGxlLmNvbS9pc19yb290Ijp0cnVlLCJpc3MiOiJGb28ifQ."
Utility functions
Common
tokenIssuer :: JSON -> Maybe StringOrURI Source #
Try to extract the value for the issue claim field iss from the web token in JSON form
secret :: Text -> Secret Source #
Create a Secret using the given key.
Consider using binarySecret instead if your key is not already a Data.Text.
binarySecret :: ByteString -> Secret Source #
Create a Secret using the given key.
JWT structure
claims :: JWT r -> JWTClaimsSet Source #
Extract the claims set from a JSON Web Token
header :: JWT r -> JOSEHeader Source #
Extract the header from a JSON Web Token
JWT claims set
auds :: JWTClaimsSet -> [StringOrURI] Source #
Convert the aud claim in a JWTClaimsSet into a `[StringOrURI]`
intDate :: NominalDiffTime -> Maybe IntDate Source #
Deprecated: Use numericDate instead. intDate will be removed in 1.0
Convert the NominalDiffTime into an IntDate. Returns a Nothing if the
argument is invalid (e.g. the NominalDiffTime must be convertible into a
positive Integer representing the seconds since epoch).
numericDate :: NominalDiffTime -> Maybe NumericDate Source #
Convert the NominalDiffTime into an NumericDate. Returns a Nothing if the
argument is invalid (e.g. the NominalDiffTime must be convertible into a
positive Integer representing the seconds since epoch).
stringOrURI :: Text -> Maybe StringOrURI Source #
Convert a Text into a StringOrURI . Returns a Nothing if the
String cannot be converted (e.g. if the String contains a : but is
*not* a valid URI).
stringOrURIToText :: StringOrURI -> Text Source #
Convert a StringOrURI into a Text . Returns the T.Text
representing the String as-is or a Text representation of the URI
otherwise.
secondsSinceEpoch :: NumericDate -> NominalDiffTime Source #
Return the seconds since 1970年01月01日T0:0:0Z UTC for the given IntDate
JWT header
typ :: JOSEHeader -> Maybe Text Source #
The typ (type) Header Parameter defined by [JWS] and [JWE] is used to declare the MIME Media Type [IANA.MediaTypes] of this complete JWT in contexts where this is useful to the application. This parameter has no effect upon the JWT processing.
cty :: JOSEHeader -> Maybe Text Source #
The cty (content type) Header Parameter defined by [JWS] and [JWE] is used by this specification to convey structural information about the JWT.
alg :: JOSEHeader -> Maybe Algorithm Source #
The alg (algorithm) used for signing the JWT. The HS256 (HMAC using SHA-256) is the only required algorithm and the only one supported in this implementation in addition to "none" which means that no signature will be used.
See http://tools.ietf.org/html/draft-ietf-jose-json-web-algorithms-23#page-6
Types
data UnverifiedJWT Source #
JSON Web Token without signature verification
data VerifiedJWT Source #
JSON Web Token that has been successfully verified
The secret used for calculating the message signature
The JSON Web Token
Constructors
HMAC using SHA-256 hash algorithm
Instances
data JWTClaimsSet Source #
The JWT Claims Set represents a JSON object whose members are the claims conveyed by the JWT.
Constructors
Fields
- iss :: Maybe StringOrURI
The iss (issuer) claim identifies the principal that issued the JWT.
- sub :: Maybe StringOrURI
The sub (subject) claim identifies the principal that is the subject of the JWT.
- aud :: Maybe (Either StringOrURI [StringOrURI])
The aud (audience) claim identifies the audiences that the JWT is intended for according to draft 18 of the JWT spec, the aud claim is option and may be present in singular or as a list.
- exp :: Maybe IntDate
The exp (expiration time) claim identifies the expiration time on or after which the JWT MUST NOT be accepted for processing. Its value MUST be a number containing an IntDate value.
- nbf :: Maybe IntDate
The nbf (not before) claim identifies the time before which the JWT MUST NOT be accepted for processing.
- iat :: Maybe IntDate
The iat (issued at) claim identifies the time at which the JWT was issued.
- jti :: Maybe StringOrURI
The jti (JWT ID) claim provides a unique identifier for the JWT.
- unregisteredClaims :: ClaimsMap
Instances
Methods
(==) :: JWTClaimsSet -> JWTClaimsSet -> Bool #
(/=) :: JWTClaimsSet -> JWTClaimsSet -> Bool #
Methods
showsPrec :: Int -> JWTClaimsSet -> ShowS #
show :: JWTClaimsSet -> String #
showList :: [JWTClaimsSet] -> ShowS #
Methods
parseJSON :: Value -> Parser JWTClaimsSet #
Methods
def :: JWTClaimsSet #
type IntDate = NumericDate Source #
Deprecated: Use NumericDate instead. IntDate will be removed in 1.0
A JSON numeric value representing the number of seconds from 1970年01月01日T0:0:0Z UTC until the specified UTC date/time.
data NumericDate Source #
A JSON numeric value representing the number of seconds from 1970年01月01日T0:0:0Z UTC until the specified UTC date/time.
Instances
Methods
compare :: NumericDate -> NumericDate -> Ordering #
(<) :: NumericDate -> NumericDate -> Bool #
(<=) :: NumericDate -> NumericDate -> Bool #
(>) :: NumericDate -> NumericDate -> Bool #
(>=) :: NumericDate -> NumericDate -> Bool #
max :: NumericDate -> NumericDate -> NumericDate #
min :: NumericDate -> NumericDate -> NumericDate #
Methods
showsPrec :: Int -> NumericDate -> ShowS #
show :: NumericDate -> String #
showList :: [NumericDate] -> ShowS #
Methods
parseJSON :: Value -> Parser NumericDate #
data StringOrURI Source #
A JSON string value, with the additional requirement that while arbitrary string values MAY be used, any value containing a ":" character MUST be a URI [RFC3986]. StringOrURI values are compared as case-sensitive strings with no transformations or canonicalizations applied.
Instances
Methods
showsPrec :: Int -> StringOrURI -> ShowS #
show :: StringOrURI -> String #
showList :: [StringOrURI] -> ShowS #
Methods
parseJSON :: Value -> Parser StringOrURI #
type JWTHeader = JOSEHeader Source #
Deprecated: Use JOSEHeader instead. JWTHeader will be removed in 1.0
data JOSEHeader Source #
JOSE Header, describes the cryptographic operations applied to the JWT
Instances
Methods
showsPrec :: Int -> JOSEHeader -> ShowS #
show :: JOSEHeader -> String #
showList :: [JOSEHeader] -> ShowS #
Methods
parseJSON :: Value -> Parser JOSEHeader #
Methods
def :: JOSEHeader #
module Data.Default