hsaml2-0.1: OASIS Security Assertion Markup Language (SAML) V2.0

Safe HaskellNone
LanguageHaskell2010

SAML2.XML

Synopsis

Documentation

data URI :: * #

Represents a general universal resource identifier using its component parts.

For example, for the URI

  foo://anonymous@www.haskell.org:42/ghc?query#frag

the components are:

Instances

Eq URI 

Methods

(==) :: URI -> URI -> Bool #

(/=) :: URI -> URI -> Bool #

Data URI 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URI -> c URI #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URI #

toConstr :: URI -> Constr #

dataTypeOf :: URI -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c URI) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URI) #

gmapT :: (forall b. Data b => b -> b) -> URI -> URI #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQ :: (forall d. Data d => d -> u) -> URI -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URI -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

Ord URI 

Methods

compare :: URI -> URI -> Ordering #

(<) :: URI -> URI -> Bool #

(<=) :: URI -> URI -> Bool #

(>) :: URI -> URI -> Bool #

(>=) :: URI -> URI -> Bool #

max :: URI -> URI -> URI #

min :: URI -> URI -> URI #

Show URI 

Methods

showsPrec :: Int -> URI -> ShowS #

show :: URI -> String #

showList :: [URI] -> ShowS #

Generic URI 

Associated Types

type Rep URI :: * -> * #

Methods

from :: URI -> Rep URI x #

to :: Rep URI x -> URI #

NFData URI 

Methods

rnf :: URI -> () #

XmlPickler LocalizedURI # 
Identifiable URI CanonicalizationAlgorithm Source # 
Identifiable URI TransformAlgorithm Source # 
Identifiable URI SignatureAlgorithm Source # 
Identifiable URI MACAlgorithm Source # 
Identifiable URI DigestAlgorithm Source # 
Identifiable URI EncodingAlgorithm Source # 
Identifiable URI EncryptionAlgorithm Source # 
Identifiable URI ConfirmationMethod Source # 
Identifiable URI Consent Source # 
Identifiable URI NameIDFormat Source # 
Identifiable URI AttributeNameFormat Source # 
Identifiable URI ActionNamespace Source # 
Identifiable URI Binding Source # 
Identifiable URI StatusCode2 Source # 
Identifiable URI StatusCode1 Source # 
Identifiable URI a => XmlPickler (Identified URI a) # 

Methods

xpickle :: PU (Identified URI a) #

type Rep URI 

type IP = String Source #

data Identified b a Source #

Constructors

Identified !a 
Unidentified !b 

Instances

class Eq b => Identifiable b a | a -> b where Source #

Minimal complete definition

identifier

Instances

Identifiable URI CanonicalizationAlgorithm Source # 
Identifiable URI TransformAlgorithm Source # 
Identifiable URI SignatureAlgorithm Source # 
Identifiable URI MACAlgorithm Source # 
Identifiable URI DigestAlgorithm Source # 
Identifiable URI EncodingAlgorithm Source # 
Identifiable URI EncryptionAlgorithm Source # 
Identifiable URI ConfirmationMethod Source # 
Identifiable URI Consent Source # 
Identifiable URI NameIDFormat Source # 
Identifiable URI AttributeNameFormat Source # 
Identifiable URI ActionNamespace Source # 
Identifiable URI Binding Source # 
Identifiable URI StatusCode2 Source # 
Identifiable URI StatusCode1 Source # 
Identifiable XString DecisionType Source # 
Identifiable XString KeyTypes Source # 
Identifiable XString ContactType Source # 
Identifiable XString LogoutReason Source # 
Identifiable XString AuthnContextComparisonType Source #