module Iri.Rendering.Text.Internal where
import Iri.Data.Types
import Iri.Prelude
import qualified Iri.Rendering.TextBuilder.Internal as A
import qualified TextBuilder as B
iri :: Iri -> Text
iri :: Iri -> Text
iri = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Iri -> TextBuilder) -> Iri -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Iri -> TextBuilder
A.iri
httpIri :: HttpIri -> Text
httpIri :: HttpIri -> Text
httpIri = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (HttpIri -> TextBuilder) -> HttpIri -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. HttpIri -> TextBuilder
A.httpIri
scheme :: Scheme -> Text
scheme :: Scheme -> Text
scheme = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Scheme -> TextBuilder) -> Scheme -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Scheme -> TextBuilder
A.scheme
hierarchy :: Hierarchy -> Text
hierarchy :: Hierarchy -> Text
hierarchy = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (Hierarchy -> TextBuilder) -> Hierarchy -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Hierarchy -> TextBuilder
A.hierarchy
authority :: Authority -> Text
authority :: Authority -> Text
authority = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (Authority -> TextBuilder) -> Authority -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Authority -> TextBuilder
A.authority
userInfo :: UserInfo -> Text
userInfo :: UserInfo -> Text
userInfo = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (UserInfo -> TextBuilder) -> UserInfo -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. UserInfo -> TextBuilder
A.userInfo
host :: Host -> Text
host :: Host -> Text
host = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Host -> TextBuilder) -> Host -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Host -> TextBuilder
A.host
regName :: RegName -> Text
regName :: RegName -> Text
regName = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (RegName -> TextBuilder) -> RegName -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. RegName -> TextBuilder
A.regName
domainLabel :: DomainLabel -> Text
domainLabel :: DomainLabel -> Text
domainLabel = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (DomainLabel -> TextBuilder) -> DomainLabel -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. DomainLabel -> TextBuilder
A.domainLabel
ipV4 :: IPv4 -> Text
ipV4 :: IPv4 -> Text
ipV4 = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (IPv4 -> TextBuilder) -> IPv4 -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. IPv4 -> TextBuilder
A.ipV4
ipV6 :: IPv6 -> Text
ipV6 :: IPv6 -> Text
ipV6 = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (IPv6 -> TextBuilder) -> IPv6 -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. IPv6 -> TextBuilder
A.ipV6
port :: Port -> Text
port :: Port -> Text
port = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Port -> TextBuilder) -> Port -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Port -> TextBuilder
A.port
path :: Path -> Text
path :: Path -> Text
path = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Path -> TextBuilder) -> Path -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Path -> TextBuilder
A.path
pathSegment :: PathSegment -> Text
pathSegment :: PathSegment -> Text
pathSegment = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (PathSegment -> TextBuilder) -> PathSegment -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. PathSegment -> TextBuilder
A.pathSegment
query :: Query -> Text
query :: Query -> Text
query = TextBuilder -> Text
B.toText (TextBuilder -> Text) -> (Query -> TextBuilder) -> Query -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Query -> TextBuilder
A.query
fragment :: Fragment -> Text
fragment :: Fragment -> Text
fragment = TextBuilder -> Text
B.toText (TextBuilder -> Text)
-> (Fragment -> TextBuilder) -> Fragment -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
forall {k} (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Fragment -> TextBuilder
A.fragment