| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Data.Url
- class MonadUrl b m where
- class ToLocation a b t | a -> b t where
- toLocation :: a -> Location b t
- class UrlReader m where
- type RunUrlReader m :: * -> *
- runUrlReader :: m a -> UrlAuthority -> RunUrlReader m a
- data UrlAuthority = UrlAuthority {}
- data UrlAuthent = UrlAuthent {}
- newtype RelativeUrlT m a = RelativeUrlT {
- runRelativeUrlT :: UrlAuthority -> m a
- type RelativeUrl = RelativeUrlT Identity
- newtype GroundedUrlT m a = GroundedUrlT {
- runGroundedUrlT :: UrlAuthority -> m a
- type GroundedUrl = GroundedUrlT Identity
- newtype AbsoluteUrlT m a = AbsoluteUrlT {
- runAbsoluteUrlT :: UrlAuthority -> m a
- type AbsoluteUrl = AbsoluteUrlT Identity
Classes
class MonadUrl b m where Source
Methods
pathUrl :: Path b t -> m String Source
locUrl :: Location b t -> m String Source
symbolUrl :: ToLocation s b t => s -> m String Source
Instances
| (MonadUrl b m, MonadTrans t, Monad m) => MonadUrl b (t m) Source | |
| Applicative m => MonadUrl Rel (RelativeUrlT m) Source | |
| Applicative m => MonadUrl Abs (AbsoluteUrlT m) Source | |
| Applicative m => MonadUrl Abs (GroundedUrlT m) Source |
class ToLocation a b t | a -> b t where Source
Make an instance for your own stringless route type to use your symbols
instead of strings or Path.
Methods
toLocation :: a -> Location b t Source
class UrlReader m where Source
Overload extraction for deployment transformers.
Associated Types
type RunUrlReader m :: * -> * Source
Methods
Arguments
| :: m a | MonadReader with index |
| -> UrlAuthority | URI Scheme, hostname, and other details |
| -> RunUrlReader m a | Final result |
Instances
Types
data UrlAuthent Source
Constructors
| UrlAuthent | |
Fields
| |
Instances
Relative Urls
newtype RelativeUrlT m a Source
Constructors
| RelativeUrlT | |
Fields
| |
Instances
| MonadTrans RelativeUrlT Source | |
| Applicative m => MonadUrl Rel (RelativeUrlT m) Source | |
| Monad m => Monad (RelativeUrlT m) Source | |
| Functor m => Functor (RelativeUrlT m) Source | |
| Applicative m => Applicative (RelativeUrlT m) Source | |
| MonadIO m => MonadIO (RelativeUrlT m) Source | |
| UrlReader (RelativeUrlT m) Source | |
| type RunUrlReader (RelativeUrlT m) = m Source |
type RelativeUrl = RelativeUrlT Identity Source
Grounded Urls
newtype GroundedUrlT m a Source
Constructors
| GroundedUrlT | |
Fields
| |
Instances
| MonadTrans GroundedUrlT Source | |
| Applicative m => MonadUrl Abs (GroundedUrlT m) Source | |
| Monad m => Monad (GroundedUrlT m) Source | |
| Functor m => Functor (GroundedUrlT m) Source | |
| Applicative m => Applicative (GroundedUrlT m) Source | |
| MonadIO m => MonadIO (GroundedUrlT m) Source | |
| UrlReader (GroundedUrlT m) Source | |
| type RunUrlReader (GroundedUrlT m) = m Source |
type GroundedUrl = GroundedUrlT Identity Source
Absolute Urls
newtype AbsoluteUrlT m a Source
Constructors
| AbsoluteUrlT | |
Fields
| |
Instances
| MonadTrans AbsoluteUrlT Source | |
| Applicative m => MonadUrl Abs (AbsoluteUrlT m) Source | |
| Monad m => Monad (AbsoluteUrlT m) Source | |
| Functor m => Functor (AbsoluteUrlT m) Source | |
| Applicative m => Applicative (AbsoluteUrlT m) Source | |
| MonadIO m => MonadIO (AbsoluteUrlT m) Source | |
| UrlReader (AbsoluteUrlT m) Source | |
| type RunUrlReader (AbsoluteUrlT m) = m Source |
type AbsoluteUrl = AbsoluteUrlT Identity Source