iri-0.5.1.1: RFC-compliant universal resource identifier library (URL, URI, IRI)
Safe HaskellSafe-Inferred
LanguageHaskell2010

Iri.Data

Description

Synopsis

Documentation

data Iri Source #

Thorough structure of IRI or URI.

Constructors

Iri !Scheme !Hierarchy !Query !Fragment 

Instances

Instances details
Generic Iri Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Iri :: Type -> Type #

Methods

from :: Iri -> Rep Iri x #

to :: Rep Iri x -> Iri #

Show Iri Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> Iri -> ShowS #

show :: Iri -> String #

showList :: [Iri] -> ShowS #

Eq Iri Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Iri Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: Iri -> Iri -> Ordering #

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

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

(>) :: Iri -> Iri -> Bool #

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

max :: Iri -> Iri -> Iri #

min :: Iri -> Iri -> Iri #

Hashable Iri Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Iri -> Int #

hash :: Iri -> Int #

Lift Iri Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Iri -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Iri -> Code m Iri #

type Rep Iri Source # 
Instance details

Defined in Iri.Data.Instances.Generic

newtype Scheme Source #

Constructors

Scheme ByteString 

Instances

Instances details
Generic Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Scheme :: Type -> Type #

Methods

from :: Scheme -> Rep Scheme x #

to :: Rep Scheme x -> Scheme #

Show Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Scheme -> Int #

hash :: Scheme -> Int #

Lift Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Scheme -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Scheme -> Code m Scheme #

type Rep Scheme Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Scheme = D1 ('MetaData "Scheme" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "Scheme" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

data Hierarchy Source #

Instances

Instances details
Generic Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Hierarchy :: Type -> Type #

Show Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Lift Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Hierarchy -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Hierarchy -> Code m Hierarchy #

type Rep Hierarchy Source # 
Instance details

Defined in Iri.Data.Instances.Generic

data Authority Source #

Constructors

Authority !UserInfo !Host !Port 

Instances

Instances details
Generic Authority Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Authority :: Type -> Type #

Show Authority Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Authority Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord Authority Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Authority Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Lift Authority Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Authority -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Authority -> Code m Authority #

type Rep Authority Source # 
Instance details

Defined in Iri.Data.Instances.Generic

data UserInfo Source #

Instances

Instances details
Generic UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep UserInfo :: Type -> Type #

Methods

from :: UserInfo -> Rep UserInfo x #

to :: Rep UserInfo x -> UserInfo #

Show UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> UserInfo -> Int #

hash :: UserInfo -> Int #

Lift UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => UserInfo -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UserInfo -> Code m UserInfo #

type Rep UserInfo Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep UserInfo = D1 ('MetaData "UserInfo" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'False) (C1 ('MetaCons "PresentUserInfo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 User) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Password)) :+: C1 ('MetaCons "MissingUserInfo" 'PrefixI 'False) (U1 :: Type -> Type))

newtype User Source #

Constructors

User ByteString 

Instances

Instances details
Generic User Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep User :: Type -> Type #

Methods

from :: User -> Rep User x #

to :: Rep User x -> User #

Show User Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

Eq User Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord User Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: User -> User -> Ordering #

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

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

(>) :: User -> User -> Bool #

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

max :: User -> User -> User #

min :: User -> User -> User #

Hashable User Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> User -> Int #

hash :: User -> Int #

Lift User Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => User -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => User -> Code m User #

type Rep User Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep User = D1 ('MetaData "User" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "User" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

data Password Source #

Instances

Instances details
Generic Password Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Password :: Type -> Type #

Methods

from :: Password -> Rep Password x #

to :: Rep Password x -> Password #

Show Password Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Password Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord Password Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Password Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Password -> Int #

hash :: Password -> Int #

Lift Password Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Password -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Password -> Code m Password #

type Rep Password Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Password = D1 ('MetaData "Password" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'False) (C1 ('MetaCons "PresentPassword" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "MissingPassword" 'PrefixI 'False) (U1 :: Type -> Type))

data Host Source #

Instances

Instances details
Generic Host Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Host :: Type -> Type #

Methods

from :: Host -> Rep Host x #

to :: Rep Host x -> Host #

Show Host Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> Host -> ShowS #

show :: Host -> String #

showList :: [Host] -> ShowS #

Eq Host Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Host Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: Host -> Host -> Ordering #

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

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

(>) :: Host -> Host -> Bool #

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

max :: Host -> Host -> Host #

min :: Host -> Host -> Host #

Hashable Host Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Host -> Int #

hash :: Host -> Int #

Lift Host Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Host -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Host -> Code m Host #

type Rep Host Source # 
Instance details

Defined in Iri.Data.Instances.Generic

newtype RegName Source #

Constructors

RegName (Vector DomainLabel) 

Instances

Instances details
Generic RegName Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep RegName :: Type -> Type #

Methods

from :: RegName -> Rep RegName x #

to :: Rep RegName x -> RegName #

Show RegName Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq RegName Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord RegName Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable RegName Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> RegName -> Int #

hash :: RegName -> Int #

Lift RegName Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => RegName -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => RegName -> Code m RegName #

type Rep RegName Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep RegName = D1 ('MetaData "RegName" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "RegName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Vector DomainLabel))))

data DomainLabel Source #

Constructors

DomainLabel Text 

Instances

Instances details
Generic DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep DomainLabel :: Type -> Type #

Show DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Lift DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => DomainLabel -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => DomainLabel -> Code m DomainLabel #

type Rep DomainLabel Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep DomainLabel = D1 ('MetaData "DomainLabel" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'False) (C1 ('MetaCons "DomainLabel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)))

data Port Source #

Instances

Instances details
Generic Port Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Port :: Type -> Type #

Methods

from :: Port -> Rep Port x #

to :: Rep Port x -> Port #

Show Port Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> Port -> ShowS #

show :: Port -> String #

showList :: [Port] -> ShowS #

Eq Port Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Port Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: Port -> Port -> Ordering #

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

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

(>) :: Port -> Port -> Bool #

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

max :: Port -> Port -> Port #

min :: Port -> Port -> Port #

Hashable Port Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Port -> Int #

hash :: Port -> Int #

Lift Port Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Port -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Port -> Code m Port #

type Rep Port Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Port = D1 ('MetaData "Port" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'False) (C1 ('MetaCons "PresentPort" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word16)) :+: C1 ('MetaCons "MissingPort" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Path Source #

Constructors

Path (Vector PathSegment) 

Instances

Instances details
Generic Path Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Path :: Type -> Type #

Methods

from :: Path -> Rep Path x #

to :: Rep Path x -> Path #

Show Path Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> Path -> ShowS #

show :: Path -> String #

showList :: [Path] -> ShowS #

Eq Path Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Path Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: Path -> Path -> Ordering #

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

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

(>) :: Path -> Path -> Bool #

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

max :: Path -> Path -> Path #

min :: Path -> Path -> Path #

Hashable Path Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Path -> Int #

hash :: Path -> Int #

Lift Path Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Path -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Path -> Code m Path #

type Rep Path Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Path = D1 ('MetaData "Path" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "Path" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Vector PathSegment))))

newtype PathSegment Source #

Constructors

PathSegment ByteString 

Instances

Instances details
Generic PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep PathSegment :: Type -> Type #

Show PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Lift PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => PathSegment -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => PathSegment -> Code m PathSegment #

type Rep PathSegment Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep PathSegment = D1 ('MetaData "PathSegment" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "PathSegment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype Query Source #

Since the exact structure of the query string is not standardised and methods used to parse the query string may differ between websites, we simply represent it as percent-decoded bytes.

See https://en.wikipedia.org/wiki/Query_string.

Constructors

Query ByteString 

Instances

Instances details
Generic Query Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Query :: Type -> Type #

Methods

from :: Query -> Rep Query x #

to :: Rep Query x -> Query #

Show Query Source # 
Instance details

Defined in Iri.Data.Instances.Show

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Eq Query Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord Query Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Methods

compare :: Query -> Query -> Ordering #

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

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

(>) :: Query -> Query -> Bool #

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

max :: Query -> Query -> Query #

min :: Query -> Query -> Query #

Hashable Query Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Query -> Int #

hash :: Query -> Int #

Lift Query Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Query -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Query -> Code m Query #

type Rep Query Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Query = D1 ('MetaData "Query" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "Query" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype Fragment Source #

Constructors

Fragment ByteString 

Instances

Instances details
Generic Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Fragment :: Type -> Type #

Methods

from :: Fragment -> Rep Fragment x #

to :: Rep Fragment x -> Fragment #

Show Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Fragment -> Int #

hash :: Fragment -> Int #

Lift Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Fragment -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Fragment -> Code m Fragment #

type Rep Fragment Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Fragment = D1 ('MetaData "Fragment" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "Fragment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Special cases

HTTP special case

data HttpIri Source #

HTTP being by far the most common use-case for resource identifiers, it's been isolated into a dedicated data-type, which is optimised for that particular case.

Compared to the general URI definition it:

  • only supports the HTTP and HTTPS schemes
  • misses the Username and Password components
  • requires the Host component
  • requires the Path component to be absolute

Instances

Instances details
Generic HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep HttpIri :: Type -> Type #

Methods

from :: HttpIri -> Rep HttpIri x #

to :: Rep HttpIri x -> HttpIri #

Show HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Methods

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

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

Ord HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> HttpIri -> Int #

hash :: HttpIri -> Int #

Lift HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => HttpIri -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => HttpIri -> Code m HttpIri #

type Rep HttpIri Source # 
Instance details

Defined in Iri.Data.Instances.Generic

newtype Security Source #

Constructors

Security Bool 

Instances

Instances details
Generic Security Source # 
Instance details

Defined in Iri.Data.Instances.Generic

Associated Types

type Rep Security :: Type -> Type #

Methods

from :: Security -> Rep Security x #

to :: Rep Security x -> Security #

Show Security Source # 
Instance details

Defined in Iri.Data.Instances.Show

Eq Security Source # 
Instance details

Defined in Iri.Data.Instances.Eq

Ord Security Source # 
Instance details

Defined in Iri.Data.Instances.Ord

Hashable Security Source # 
Instance details

Defined in Iri.Data.Instances.Hashable

Methods

hashWithSalt :: Int -> Security -> Int #

hash :: Security -> Int #

Lift Security Source # 
Instance details

Defined in Iri.Data.Instances.Lift

Methods

lift :: Quote m => Security -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Security -> Code m Security #

type Rep Security Source # 
Instance details

Defined in Iri.Data.Instances.Generic

type Rep Security = D1 ('MetaData "Security" "Iri.Data.Types" "iri-0.5.1.1-H6emllxMvLn58XoQNu4ebf" 'True) (C1 ('MetaCons "Security" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

httpIriFromIri :: Iri -> Either Text HttpIri Source #

Try to specialize a general IRI to HTTP

iriFromHttpIri :: HttpIri -> Iri Source #

Generalize an HTTP IRI to IRI