Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- newtype TemplateKey = TemplateKey {}
- newtype TemplateValue = TemplateValue {}
- data Template a = Template {}
- data Uninterpolated a
- data InterpolationFailure
- newtype InterpolationContext = InterpolationContext {}
- class FromTemplateValue a where
- parseTemplateValue :: TemplateValue -> Maybe a
- class ToTemplateValue a where
- toTemplateValue :: a -> TemplateValue
- newtype Interpolator templates identities = Interpolator {
- runInterpolator :: templates -> Reader InterpolationContext (Validation [InterpolationFailure] identities)
- runTemplate :: FromTemplateValue a => Interpolator (Uninterpolated a) a
- mkInterpolationContext :: MonadIO m => m InterpolationContext
- interpolateWithContext :: (Default Interpolator templates identities, MonadIO m) => templates -> m (Either [InterpolationFailure] identities)
- interpolateWithContextExplicit :: MonadIO m => Interpolator templates identities -> templates -> m (Either [InterpolationFailure] identities)
Documentation
newtype TemplateKey Source #
Newtype wrapper for an environment variable key.
Instances
newtype TemplateValue Source #
Newtype wrapper for an environment variable value.
Instances
Type for a value that is described by '_env:ENVIRONMENT_VARIABLE:default' in JSON.
Instances
Eq a => Eq (Template a) Source # | |
Ord a => Ord (Template a) Source # | |
Show a => Show (Template a) Source # | |
FromTemplateValue a => FromJSON (Template a) Source # | |
Defined in Data.Interpolation parseJSON :: Value -> Parser (Template a) parseJSONList :: Value -> Parser [Template a] | |
ToTemplateValue a => ToJSON (Template a) Source # | |
Defined in Data.Interpolation toEncoding :: Template a -> Encoding toJSONList :: [Template a] -> Value toEncodingList :: [Template a] -> Encoding |
data Uninterpolated a Source #
Type for a value that can be described either with '_env...' or as just a literal value in JSON.
Instances
data InterpolationFailure Source #
InterpolationFailureKeyNotFound TemplateKey | |
InterpolationFailureValueNotReadable TemplateKey TemplateValue |
Instances
Eq InterpolationFailure Source # | |
Defined in Data.Interpolation (==) :: InterpolationFailure -> InterpolationFailure -> Bool # (/=) :: InterpolationFailure -> InterpolationFailure -> Bool # | |
Ord InterpolationFailure Source # | |
Defined in Data.Interpolation compare :: InterpolationFailure -> InterpolationFailure -> Ordering # (<) :: InterpolationFailure -> InterpolationFailure -> Bool # (<=) :: InterpolationFailure -> InterpolationFailure -> Bool # (>) :: InterpolationFailure -> InterpolationFailure -> Bool # (>=) :: InterpolationFailure -> InterpolationFailure -> Bool # max :: InterpolationFailure -> InterpolationFailure -> InterpolationFailure # min :: InterpolationFailure -> InterpolationFailure -> InterpolationFailure # | |
Show InterpolationFailure Source # | |
Defined in Data.Interpolation showsPrec :: Int -> InterpolationFailure -> ShowS # show :: InterpolationFailure -> String # showList :: [InterpolationFailure] -> ShowS # |
newtype InterpolationContext Source #
class FromTemplateValue a where Source #
A class for parsing environment variable values, which should only be defined on primitives.
Similar to Read
except that for text-type values it should parse using identity.
parseTemplateValue :: TemplateValue -> Maybe a Source #
Instances
FromTemplateValue Bool Source # | |
Defined in Data.Interpolation | |
FromTemplateValue Int Source # | |
Defined in Data.Interpolation | |
FromTemplateValue String Source # | |
Defined in Data.Interpolation | |
FromTemplateValue Text Source # | |
Defined in Data.Interpolation |
class ToTemplateValue a where Source #
A class for showing environment variable values, which should only be defined on primitives.
Similar to Show
except that for text-type values it should use identity.
toTemplateValue :: a -> TemplateValue Source #
Instances
ToTemplateValue Bool Source # | |
Defined in Data.Interpolation toTemplateValue :: Bool -> TemplateValue Source # | |
ToTemplateValue Int Source # | |
Defined in Data.Interpolation toTemplateValue :: Int -> TemplateValue Source # | |
ToTemplateValue String Source # | |
Defined in Data.Interpolation | |
ToTemplateValue Text Source # | |
Defined in Data.Interpolation toTemplateValue :: Text -> TemplateValue Source # |
newtype Interpolator templates identities Source #
Interpolator | |
|
Instances
Profunctor Interpolator Source # | |
Defined in Data.Interpolation dimap :: (a -> b) -> (c -> d) -> Interpolator b c -> Interpolator a d lmap :: (a -> b) -> Interpolator b c -> Interpolator a c rmap :: (b -> c) -> Interpolator a b -> Interpolator a c (#.) :: Coercible c b => q b c -> Interpolator a b -> Interpolator a c (.#) :: Coercible b a => Interpolator b c -> q a b -> Interpolator a c | |
ProductProfunctor Interpolator Source # | |
Defined in Data.Interpolation purePP :: b -> Interpolator a b (****) :: Interpolator a (b -> c) -> Interpolator a b -> Interpolator a c empty :: Interpolator () () (***!) :: Interpolator a b -> Interpolator a' b' -> Interpolator (a, a') (b, b') | |
SumProfunctor Interpolator Source # | |
Defined in Data.Interpolation (+++!) :: Interpolator a b -> Interpolator a' b' -> Interpolator (Either a a') (Either b b') | |
Default Interpolator a a Source # | Pure transformation for the identity interpolation. FIXME this is too clunky for overlapping instances, define an auxiliary class (or type) for IdentityInterpolation. |
Defined in Data.Interpolation def :: Interpolator a a | |
FromTemplateValue a => Default Interpolator (Uninterpolated a) a Source # | When we can parse template values, we can interpolate from the template. |
Defined in Data.Interpolation def :: Interpolator (Uninterpolated a) a | |
Default Interpolator a b => Default Interpolator [a] [b] Source # | |
Defined in Data.Interpolation def :: Interpolator [a] [b] | |
Default Interpolator a b => Default Interpolator (Maybe a) (Maybe b) Source # | |
Defined in Data.Interpolation def :: Interpolator (Maybe a) (Maybe b) | |
(Default Interpolator a b, Ord a, Ord b) => Default Interpolator (Set a) (Set b) Source # | |
Defined in Data.Interpolation def :: Interpolator (Set a) (Set b) | |
Default Interpolator a b => Default Interpolator (Map k a) (Map k b) Source # | |
Defined in Data.Interpolation def :: Interpolator (Map k a) (Map k b) | |
Functor (Interpolator templates) Source # | |
Defined in Data.Interpolation fmap :: (a -> b) -> Interpolator templates a -> Interpolator templates b # (<$) :: a -> Interpolator templates b -> Interpolator templates a # | |
Applicative (Interpolator templates) Source # | |
Defined in Data.Interpolation pure :: a -> Interpolator templates a # (<*>) :: Interpolator templates (a -> b) -> Interpolator templates a -> Interpolator templates b # liftA2 :: (a -> b -> c) -> Interpolator templates a -> Interpolator templates b -> Interpolator templates c # (*>) :: Interpolator templates a -> Interpolator templates b -> Interpolator templates b # (<*) :: Interpolator templates a -> Interpolator templates b -> Interpolator templates a # |
runTemplate :: FromTemplateValue a => Interpolator (Uninterpolated a) a Source #
Run a template using the interpolation context and failing if the value is not found or not readable.
mkInterpolationContext :: MonadIO m => m InterpolationContext Source #
interpolateWithContext :: (Default Interpolator templates identities, MonadIO m) => templates -> m (Either [InterpolationFailure] identities) Source #
interpolateWithContextExplicit :: MonadIO m => Interpolator templates identities -> templates -> m (Either [InterpolationFailure] identities) Source #