{-# LANGUAGE DeriveDataTypeable #-}
module Web.Authenticate.Internal
    ( AuthenticateException (..)
    ) where

import Data.Typeable (Typeable)
import Control.Exception (Exception)

data AuthenticateException =
      RpxnowException String
    | NormalizationException String
    | DiscoveryException String
    | AuthenticationException String
  deriving (Int -> AuthenticateException -> ShowS
[AuthenticateException] -> ShowS
AuthenticateException -> String
(Int -> AuthenticateException -> ShowS)
-> (AuthenticateException -> String)
-> ([AuthenticateException] -> ShowS)
-> Show AuthenticateException
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AuthenticateException] -> ShowS
$cshowList :: [AuthenticateException] -> ShowS
show :: AuthenticateException -> String
$cshow :: AuthenticateException -> String
showsPrec :: Int -> AuthenticateException -> ShowS
$cshowsPrec :: Int -> AuthenticateException -> ShowS
Show, Typeable)
instance Exception AuthenticateException