{-# LINE 1 "src/Libjwt/FFI/Libjwt.hsc" #-}
--   This Source Code Form is subject to the terms of the Mozilla Public
--   License, v. 2.0. If a copy of the MPL was not distributed with this
--   file, You can obtain one at http://mozilla.org/MPL/2.0/.

{-# LANGUAGE CPP, ForeignFunctionInterface #-}
{-# LANGUAGE DerivingStrategies #-}

module Libjwt.FFI.Libjwt where

import Foreign.C.Types

newtype JwtAlgT = JwtAlg CInt
  deriving stock JwtAlgT -> JwtAlgT -> Bool
(JwtAlgT -> JwtAlgT -> Bool)
-> (JwtAlgT -> JwtAlgT -> Bool) -> Eq JwtAlgT
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: JwtAlgT -> JwtAlgT -> Bool
$c/= :: JwtAlgT -> JwtAlgT -> Bool
== :: JwtAlgT -> JwtAlgT -> Bool
$c== :: JwtAlgT -> JwtAlgT -> Bool
Eq



jwtAlgNone :: JwtAlgT
jwtAlgNone :: JwtAlgT
jwtAlgNone = CInt -> JwtAlgT
JwtAlg CInt
0
jwtAlgHs256 :: JwtAlgT
jwtAlgHs256 :: JwtAlgT
jwtAlgHs256 = CInt -> JwtAlgT
JwtAlg CInt
1
jwtAlgHs384 :: JwtAlgT
jwtAlgHs384 :: JwtAlgT
jwtAlgHs384 = CInt -> JwtAlgT
JwtAlg CInt
2
jwtAlgHs512 :: JwtAlgT
jwtAlgHs512 :: JwtAlgT
jwtAlgHs512 = CInt -> JwtAlgT
JwtAlg CInt
3
jwtAlgRs256 :: JwtAlgT
jwtAlgRs256 :: JwtAlgT
jwtAlgRs256 = CInt -> JwtAlgT
JwtAlg CInt
4
jwtAlgRs384 :: JwtAlgT
jwtAlgRs384 :: JwtAlgT
jwtAlgRs384 = CInt -> JwtAlgT
JwtAlg CInt
5
jwtAlgRs512 :: JwtAlgT
jwtAlgRs512 :: JwtAlgT
jwtAlgRs512 = CInt -> JwtAlgT
JwtAlg CInt
6
jwtAlgEs256 :: JwtAlgT
jwtAlgEs256 :: JwtAlgT
jwtAlgEs256 = CInt -> JwtAlgT
JwtAlg CInt
7
jwtAlgEs384 :: JwtAlgT
jwtAlgEs384 :: JwtAlgT
jwtAlgEs384 = CInt -> JwtAlgT
JwtAlg CInt
8
jwtAlgEs512 :: JwtAlgT
jwtAlgEs512 :: JwtAlgT
jwtAlgEs512 = CInt -> JwtAlgT
JwtAlg CInt
9
jwtAlgTerm  :: JwtAlgT
jwtAlgTerm :: JwtAlgT
jwtAlgTerm  = CInt -> JwtAlgT
JwtAlg CInt
10

{-# LINE 18 "src/Libjwt/FFI/Libjwt.hsc" #-}