| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Faker.Internal
Description
Internal module
Documentation
newtype Unresolved a Source #
Constructors
| Unresolved | |
| Fields 
 | |
Instances
| Monad Unresolved Source # | |
| Defined in Faker.Internal Methods (>>=) :: Unresolved a -> (a -> Unresolved b) -> Unresolved b # (>>) :: Unresolved a -> Unresolved b -> Unresolved b # return :: a -> Unresolved a # fail :: String -> Unresolved a # | |
| Functor Unresolved Source # | |
| Defined in Faker.Internal Methods fmap :: (a -> b) -> Unresolved a -> Unresolved b # (<$) :: a -> Unresolved b -> Unresolved a # | |
| Applicative Unresolved Source # | |
| Defined in Faker.Internal Methods pure :: a -> Unresolved a # (<*>) :: Unresolved (a -> b) -> Unresolved a -> Unresolved b # liftA2 :: (a -> b -> c) -> Unresolved a -> Unresolved b -> Unresolved c # (*>) :: Unresolved a -> Unresolved b -> Unresolved b # (<*) :: Unresolved a -> Unresolved b -> Unresolved a # | |
newtype RegexFakeValue Source #
Constructors
| RegexFakeValue | |
| Fields | |
Instances
| Eq RegexFakeValue Source # | |
| Defined in Faker.Internal Methods (==) :: RegexFakeValue -> RegexFakeValue -> Bool # (/=) :: RegexFakeValue -> RegexFakeValue -> Bool # | |
| Ord RegexFakeValue Source # | |
| Defined in Faker.Internal Methods compare :: RegexFakeValue -> RegexFakeValue -> Ordering # (<) :: RegexFakeValue -> RegexFakeValue -> Bool # (<=) :: RegexFakeValue -> RegexFakeValue -> Bool # (>) :: RegexFakeValue -> RegexFakeValue -> Bool # (>=) :: RegexFakeValue -> RegexFakeValue -> Bool # max :: RegexFakeValue -> RegexFakeValue -> RegexFakeValue # min :: RegexFakeValue -> RegexFakeValue -> RegexFakeValue # | |
| Show RegexFakeValue Source # | |
| Defined in Faker.Internal Methods showsPrec :: Int -> RegexFakeValue -> ShowS # show :: RegexFakeValue -> String # showList :: [RegexFakeValue] -> ShowS # | |
rvec :: (MonadThrow m, MonadIO m) => FakerSettings -> Vector a -> m a Source #
insertToCache :: Text -> Text -> FakerSettings -> Vector Text -> IO () Source #
presentInCache :: Text -> Text -> FakerSettings -> IO (Maybe (Vector Text)) Source #
resolver :: (MonadThrow m, MonadIO m) => (FakerSettings -> m (Vector a)) -> FakerSettings -> m a Source #
refinedString :: String -> String Source #
refinedText :: Text -> Text Source #
cachedRandomVec :: (MonadThrow m, MonadIO m) => Text -> Text -> (FakerSettings -> m (Vector Text)) -> FakerSettings -> m Text Source #
cachedRandomUnresolvedVec :: (MonadThrow m, MonadIO m) => Text -> Text -> (FakerSettings -> m (Unresolved (Vector Text))) -> (FakerSettings -> Text -> m Text) -> FakerSettings -> m Text Source #
cachedRandomUnresolvedVecWithoutVector :: (MonadThrow m, MonadIO m) => Text -> Text -> (FakerSettings -> m (Unresolved Text)) -> (FakerSettings -> Text -> m Text) -> FakerSettings -> m Text Source #
cachedRegex :: (MonadThrow m, MonadIO m) => Text -> Text -> (FakerSettings -> m Regex) -> FakerSettings -> m RegexFakeValue Source #
resolveUnresolved :: (MonadThrow m, MonadIO m) => FakerSettings -> Unresolved (Vector Text) -> (FakerSettings -> Text -> m Text) -> m Text Source #
modifyRandomGen :: FakerSettings -> Word64 -> FakerSettings Source #
resolveFields :: (MonadIO m, MonadThrow m) => Text -> m [FakeIRValue] Source #
genericResolver :: (MonadIO m, MonadThrow m) => FakerSettings -> Text -> (FakerSettings -> Text -> m Text) -> m Text Source #
genericResolver' :: (MonadIO m, MonadThrow m) => (FakerSettings -> Text -> m Text) -> FakerSettings -> Text -> m Text Source #