Copyright | (c) digitally induced GmbH 2020 |
---|---|
Safe Haskell | Safe-Inferred |
IHP.MailPrelude
Description
Synopsis
- module IHP.Mail
- seq :: forall {r :: RuntimeRep} a (b :: TYPE r). a -> b -> b
- filter :: (a -> Bool) -> [a] -> [a]
- zip :: [a] -> [b] -> [(a, b)]
- fst :: (a, b) -> a
- snd :: (a, b) -> b
- otherwise :: Bool
- map :: (a -> b) -> [a] -> [b]
- ($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b
- fromIntegral :: (Integral a, Num b) => a -> b
- realToFrac :: (Real a, Fractional b) => a -> b
- join :: Monad m => m (m a) -> m a
- class Bounded a where
- class Enum a where
- succ :: a -> a
- pred :: a -> a
- toEnum :: Int -> a
- fromEnum :: a -> Int
- enumFrom :: a -> [a]
- enumFromThen :: a -> a -> [a]
- enumFromTo :: a -> a -> [a]
- enumFromThenTo :: a -> a -> a -> [a]
- class Eq a where
- class Fractional a => Floating a where
- class Num a => Fractional a where
- (/) :: a -> a -> a
- recip :: a -> a
- fromRational :: Rational -> a
- class (Real a, Enum a) => Integral a where
- class Applicative m => Monad (m :: Type -> Type) where
- class Typeable a => Data a where
- gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> a -> c a
- gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c a
- toConstr :: a -> Constr
- dataTypeOf :: a -> DataType
- dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c a)
- dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a)
- gmapT :: (forall b. Data b => b -> b) -> a -> a
- gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r
- gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r
- gmapQ :: (forall d. Data d => d -> u) -> a -> [u]
- gmapQi :: Int -> (forall d. Data d => d -> u) -> a -> u
- gmapM :: Monad m => (forall d. Data d => d -> m d) -> a -> m a
- gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a
- gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a
- class Functor (f :: Type -> Type) where
- class Num a where
- class Eq a => Ord a where
- class Read a
- class (Num a, Ord a) => Real a where
- toRational :: a -> Rational
- class (RealFrac a, Floating a) => RealFloat a where
- floatRadix :: a -> Integer
- floatDigits :: a -> Int
- floatRange :: a -> (Int, Int)
- decodeFloat :: a -> (Integer, Int)
- encodeFloat :: Integer -> Int -> a
- exponent :: a -> Int
- significand :: a -> a
- scaleFloat :: Int -> a -> a
- isNaN :: a -> Bool
- isInfinite :: a -> Bool
- isDenormalized :: a -> Bool
- isNegativeZero :: a -> Bool
- isIEEE :: a -> Bool
- atan2 :: a -> a -> a
- class (Real a, Fractional a) => RealFrac a where
- class Show a
- class Typeable (a :: k)
- fail :: MonadFail m => String -> m a
- class IsString a where
- fromString :: String -> a
- class Functor f => Applicative (f :: Type -> Type) where
- class Foldable (t :: TYPE LiftedRep -> Type) where
- foldr :: (a -> b -> b) -> b -> t a -> b
- foldl :: (b -> a -> b) -> b -> t a -> b
- foldl' :: (b -> a -> b) -> b -> t a -> b
- foldr1 :: (a -> a -> a) -> t a -> a
- foldl1 :: (a -> a -> a) -> t a -> a
- length :: t a -> Int
- elem :: Eq a => a -> t a -> Bool
- maximum :: Ord a => t a -> a
- minimum :: Ord a => t a -> a
- sum :: Num a => t a -> a
- product :: Num a => t a -> a
- class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where
- class KnownSymbol (n :: Symbol)
- (<>) :: Semigroup a => a -> a -> a
- class Semigroup a => Monoid a where
- class HasField (x :: k) r a | x r -> a where
- getField :: r -> a
- data Bool
- type String = [Char]
- data Char
- data Double
- data Float
- data Int
- data Int32
- data Int64
- data Integer
- data Maybe a
- data Ordering
- type Rational = Ratio Integer
- data IO a
- data Word
- data Word8
- data Word32
- data Word64
- data Either a b
- data CallStack
- data Symbol
- data TyCon
- pollSTM :: Async a -> STM (Maybe (Either SomeException a))
- waitAnyCatchSTM :: [Async a] -> STM (Async a, Either SomeException a)
- waitAnySTM :: [Async a] -> STM (Async a, a)
- waitBothSTM :: Async a -> Async b -> STM (a, b)
- waitCatchSTM :: Async a -> STM (Either SomeException a)
- waitEitherCatchSTM :: Async a -> Async b -> STM (Either (Either SomeException a) (Either SomeException b))
- waitEitherSTM :: Async a -> Async b -> STM (Either a b)
- waitEitherSTM_ :: Async a -> Async b -> STM ()
- waitSTM :: Async a -> STM a
- (>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c
- forever :: Applicative f => f a -> f b
- unless :: Applicative f => Bool -> f () -> f ()
- bool :: a -> a -> Bool -> a
- either :: (a -> c) -> (b -> c) -> Either a b -> c
- lefts :: [Either a b] -> [a]
- partitionEithers :: [Either a b] -> ([a], [b])
- rights :: [Either a b] -> [b]
- asum :: (Foldable t, Alternative f) => t (f a) -> f a
- on :: (b -> b -> c) -> (a -> b) -> a -> a -> c
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- fromMaybe :: a -> Maybe a -> a
- isJust :: Maybe a -> Bool
- isNothing :: Maybe a -> Bool
- listToMaybe :: [a] -> Maybe a
- mapMaybe :: (a -> Maybe b) -> [a] -> [b]
- maybe :: b -> (a -> b) -> Maybe a -> b
- maybeToList :: Maybe a -> [a]
- comparing :: Ord a => (b -> a) -> b -> b -> Ordering
- forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b)
- curry :: ((a, b) -> c) -> a -> b -> c
- swap :: (a, b) -> (b, a)
- uncurry :: (a -> b -> c) -> (a, b) -> c
- ($!) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- asTypeOf :: a -> a -> a
- const :: a -> b -> a
- flip :: (a -> b -> c) -> b -> a -> c
- until :: (a -> Bool) -> (a -> a) -> a -> a
- when :: Applicative f => Bool -> f () -> f ()
- ioError :: IOError -> IO a
- userError :: String -> IOError
- repeat :: a -> [a]
- subtract :: Num a => a -> a -> a
- (^) :: (Num a, Integral b) => a -> b -> a
- (^^) :: (Fractional a, Integral b) => a -> b -> a
- even :: Integral a => a -> Bool
- odd :: Integral a => a -> Bool
- alreadyExistsErrorType :: IOErrorType
- alreadyInUseErrorType :: IOErrorType
- annotateIOError :: IOError -> String -> Maybe Handle -> Maybe FilePath -> IOError
- doesNotExistErrorType :: IOErrorType
- eofErrorType :: IOErrorType
- fullErrorType :: IOErrorType
- illegalOperationErrorType :: IOErrorType
- ioeGetErrorString :: IOError -> String
- ioeGetErrorType :: IOError -> IOErrorType
- ioeGetFileName :: IOError -> Maybe FilePath
- ioeGetHandle :: IOError -> Maybe Handle
- ioeGetLocation :: IOError -> String
- ioeSetErrorString :: IOError -> String -> IOError
- ioeSetErrorType :: IOError -> IOErrorType -> IOError
- ioeSetFileName :: IOError -> FilePath -> IOError
- ioeSetHandle :: IOError -> Handle -> IOError
- ioeSetLocation :: IOError -> String -> IOError
- isAlreadyExistsError :: IOError -> Bool
- isAlreadyExistsErrorType :: IOErrorType -> Bool
- isAlreadyInUseError :: IOError -> Bool
- isAlreadyInUseErrorType :: IOErrorType -> Bool
- isDoesNotExistError :: IOError -> Bool
- isDoesNotExistErrorType :: IOErrorType -> Bool
- isEOFError :: IOError -> Bool
- isEOFErrorType :: IOErrorType -> Bool
- isFullError :: IOError -> Bool
- isFullErrorType :: IOErrorType -> Bool
- isIllegalOperation :: IOError -> Bool
- isIllegalOperationErrorType :: IOErrorType -> Bool
- isPermissionError :: IOError -> Bool
- isPermissionErrorType :: IOErrorType -> Bool
- isResourceVanishedError :: IOError -> Bool
- isResourceVanishedErrorType :: IOErrorType -> Bool
- isUserError :: IOError -> Bool
- isUserErrorType :: IOErrorType -> Bool
- mkIOError :: IOErrorType -> String -> Maybe Handle -> Maybe FilePath -> IOError
- modifyIOError :: (IOError -> IOError) -> IO a -> IO a
- permissionErrorType :: IOErrorType
- resourceVanishedErrorType :: IOErrorType
- tryIOError :: IO a -> IO (Either IOError a)
- userErrorType :: IOErrorType
- equating :: Eq a => (b -> a) -> b -> b -> Bool
- getArgs :: MonadIO m => m [Text]
- terror :: HasCallStack => Text -> a
- (<.>) :: FilePath -> String -> FilePath
- (</>) :: FilePath -> FilePath -> FilePath
- (&&) :: Bool -> Bool -> Bool
- not :: Bool -> Bool
- (||) :: Bool -> Bool -> Bool
- null :: MonoFoldable mono => mono -> Bool
- fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day
- toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth)
- getCurrentTime :: IO UTCTime
- formatTime :: FormatTime t => TimeLocale -> String -> t -> String
- defaultTimeLocale :: TimeLocale
- parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t
- data Async a
- data AsyncCancelled = AsyncCancelled
- second :: Arrow a => a b c -> a (d, b) (d, c)
- first :: Arrow a => a b c -> a (b, d) (c, d)
- (&&&) :: Arrow a => a b c -> a b c' -> a b (c, c')
- (***) :: Arrow a => a b c -> a b' c' -> a (b, b') (c, c')
- (.) :: forall (b :: k) (c :: k) (a :: k). Category cat => cat b c -> cat a b -> cat a c
- id :: forall (a :: k). Category cat => cat a a
- class Monad m => MonadIO (m :: Type -> Type) where
- newtype Down a = Down {
- getDown :: a
- class Storable a
- (<|>) :: Alternative f => f a -> f a -> f a
- class (Typeable e, Show e) => Exception e where
- toException :: e -> SomeException
- fromException :: SomeException -> Maybe e
- displayException :: e -> String
- data SomeException
- type FilePath = String
- type IOError = IOException
- data IOErrorType
- data IOException
- data IORef a
- type LByteString = ByteString
- type LText = Text
- type SVector = Vector
- type UVector = Vector
- data ByteString
- data IntMap a
- data IntSet
- data Map k a
- data Seq a
- data Set a
- class Eq a => Hashable a where
- hashWithSalt :: Int -> a -> Int
- hash :: a -> Int
- data Text
- newtype Day = ModifiedJulianDay {}
- data UTCTime = UTCTime {
- utctDay :: Day
- utctDayTime :: DiffTime
- lift :: (MonadTrans t, Monad m) => m a -> t m a
- data HashMap k v
- data HashSet a
- data Vector a
- class (Vector Vector a, MVector MVector a) => Unbox a
- class ParseTime t
- data TimeLocale = TimeLocale {}
- parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t
- type HasCallStack = ?callStack :: CallStack
- class Default a where
- def :: a
- data UUID
- data Proxy (t :: k) = Proxy
- calendarDay :: CalendarDiffDays
- calendarMonth :: CalendarDiffDays
- calendarWeek :: CalendarDiffDays
- calendarYear :: CalendarDiffDays
- scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays
- addDays :: Integer -> Day -> Day
- diffDays :: Day -> Day -> Integer
- pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day
- addGregorianDurationClip :: CalendarDiffDays -> Day -> Day
- addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day
- addGregorianMonthsClip :: Integer -> Day -> Day
- addGregorianMonthsRollOver :: Integer -> Day -> Day
- addGregorianYearsClip :: Integer -> Day -> Day
- addGregorianYearsRollOver :: Integer -> Day -> Day
- diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays
- diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays
- fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day
- gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth
- showGregorian :: Day -> String
- isLeapYear :: Year -> Bool
- dayOfWeek :: Day -> DayOfWeek
- dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int
- firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day
- diffTimeToPicoseconds :: DiffTime -> Integer
- picosecondsToDiffTime :: Integer -> DiffTime
- secondsToDiffTime :: Integer -> DiffTime
- nominalDay :: NominalDiffTime
- nominalDiffTimeToSeconds :: NominalDiffTime -> Pico
- secondsToNominalDiffTime :: Pico -> NominalDiffTime
- getTime_resolution :: DiffTime
- addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime
- diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime
- iso8601DateFormat :: Maybe String -> String
- rfc822DateFormat :: String
- parseTimeOrError :: ParseTime t => Bool -> TimeLocale -> String -> String -> t
- readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t
- readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t
- calendarTimeDays :: CalendarDiffDays -> CalendarDiffTime
- calendarTimeTime :: NominalDiffTime -> CalendarDiffTime
- scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime
- addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime
- diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime
- localTimeToUT1 :: Rational -> LocalTime -> UniversalTime
- localTimeToUTC :: TimeZone -> LocalTime -> UTCTime
- ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime
- utcToLocalTime :: TimeZone -> UTCTime -> LocalTime
- dayFractionToTimeOfDay :: Rational -> TimeOfDay
- daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime
- localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay
- midday :: TimeOfDay
- midnight :: TimeOfDay
- pastMidnight :: DiffTime -> TimeOfDay
- sinceMidnight :: TimeOfDay -> DiffTime
- timeOfDayToDayFraction :: TimeOfDay -> Rational
- timeOfDayToTime :: TimeOfDay -> DiffTime
- timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay)
- timeToTimeOfDay :: DiffTime -> TimeOfDay
- utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- getCurrentTimeZone :: IO TimeZone
- getTimeZone :: UTCTime -> IO TimeZone
- hoursToTimeZone :: Int -> TimeZone
- minutesToTimeZone :: Int -> TimeZone
- timeZoneOffsetString :: TimeZone -> String
- timeZoneOffsetString' :: Maybe Char -> TimeZone -> String
- utc :: TimeZone
- getZonedTime :: IO ZonedTime
- utcToLocalZonedTime :: UTCTime -> IO ZonedTime
- utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime
- zonedTimeToUTC :: ZonedTime -> UTCTime
- data CalendarDiffDays = CalendarDiffDays {}
- type DayOfMonth = Int
- type MonthOfYear = Int
- type Year = Integer
- data DayOfWeek
- data DiffTime
- data NominalDiffTime
- newtype UniversalTime = ModJulianDate {}
- class FormatTime t
- data CalendarDiffTime = CalendarDiffTime {}
- data LocalTime = LocalTime {}
- data TimeOfDay = TimeOfDay {}
- data TimeZone = TimeZone {}
- data ZonedTime = ZonedTime {}
- symbolVal :: forall (n :: Symbol) proxy. KnownSymbol n => proxy n -> String
- data (a :: k) :~: (b :: k) where
- class IsLabel (x :: Symbol) a where
- fromLabel :: a
- cs :: ConvertibleStrings a b => a -> b
- class ConvertibleStrings a b where
- convertString :: a -> b
- intercalate :: Text -> [Text] -> Text
- intersperse :: Char -> Text -> Text
- isInfixOf :: Text -> Text -> Bool
- isPrefixOf :: Text -> Text -> Bool
- isSuffixOf :: Text -> Text -> Bool
- lines :: Text -> [Text]
- splitAt :: Int -> Text -> (Text, Text)
- toLower :: Text -> Text
- toUpper :: Text -> Text
- unlines :: [Text] -> Text
- unwords :: [Text] -> Text
- words :: Text -> [Text]
- data (a :: k1) :~~: (b :: k2) where
- data DataRep
- data Constr
- data DataType
- data ConstrRep
- transpose :: [[a]] -> [[a]]
- genericSplitAt :: Integral i => i -> [a] -> ([a], [a])
- break :: (a -> Bool) -> [a] -> ([a], [a])
- dropWhile :: (a -> Bool) -> [a] -> [a]
- groupBy :: (a -> a -> Bool) -> [a] -> [[a]]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a
- takeWhile :: (a -> Bool) -> [a] -> [a]
- and :: Foldable t => t Bool -> Bool
- concatMap :: Foldable t => (a -> [b]) -> t a -> [b]
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- or :: Foldable t => t Bool -> Bool
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- (!!) :: [a] -> Int -> a
- cycle :: [a] -> [a]
- iterate :: (a -> a) -> a -> [a]
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- scanl :: (b -> a -> b) -> b -> [a] -> [b]
- scanl1 :: (a -> a -> a) -> [a] -> [a]
- scanr :: (a -> b -> b) -> b -> [a] -> [b]
- scanr1 :: (a -> a -> a) -> [a] -> [a]
- unzip :: [(a, b)] -> ([a], [b])
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- genericReplicate :: Integral i => i -> a -> [a]
- take :: Int -> [a] -> [a]
- drop :: Int -> [a] -> [a]
- partition :: (a -> Bool) -> [a] -> ([a], [a])
- replicate :: Int -> a -> [a]
- reverse :: [a] -> [a]
- stripPrefix :: Eq a => [a] -> [a] -> Maybe [a]
- deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a]
- delete :: Eq a => a -> [a] -> [a]
- mkConstr :: DataType -> String -> [String] -> Fixity -> Constr
- data Fixity
- findIndices :: (a -> Bool) -> [a] -> [Int]
- copyFields :: CopyFields fields destinationRecord sourceRecord => sourceRecord -> destinationRecord -> destinationRecord
- class HasField field model value => UpdateField (field :: Symbol) model model' value value' | model model' value' -> value where
- updateField :: value' -> model -> model'
- class SetField (field :: Symbol) model value | field model -> value where
- setField :: value -> model -> model
- class IsEmpty value where
- (|>) :: t1 -> (t1 -> t2) -> t2
- (|>>) :: Functor f => f a -> (a -> b) -> f b
- ifOrEmpty :: Monoid a => Bool -> a -> a
- whenEmpty :: (Applicative f, IsEmpty value) => value -> f () -> f ()
- whenNonEmpty :: (IsEmpty a, Applicative f) => a -> f () -> f ()
- includes :: (MonoFoldable container, Eq (Element container)) => Element container -> container -> Bool
- get :: forall model name value. (KnownSymbol name, HasField name model value) => Proxy name -> model -> value
- set :: forall model name value. (KnownSymbol name, SetField name model value) => Proxy name -> value -> model -> model
- setMaybe :: forall model name value. (KnownSymbol name, SetField name model (Maybe value)) => Proxy name -> Maybe value -> model -> model
- setJust :: forall model name value. (KnownSymbol name, SetField name model (Maybe value)) => Proxy name -> value -> model -> model
- modify :: forall model name value. (KnownSymbol name, HasField name model value, SetField name model value) => Proxy name -> (value -> value) -> model -> model
- modifyJust :: forall model name value updateFunction. (KnownSymbol name, HasField name model (Maybe value), SetField name model (Maybe value)) => Proxy name -> (value -> value) -> model -> model
- incrementField :: forall model name value. (KnownSymbol name, HasField name model value, SetField name model value, Num value) => Proxy name -> model -> model
- decrementField :: forall model name value. (KnownSymbol name, HasField name model value, SetField name model value, Num value) => Proxy name -> model -> model
- isToday :: UTCTime -> IO Bool
- isToday' :: UTCTime -> UTCTime -> Bool
- forEach :: (MonoFoldable mono, Applicative m) => mono -> (Element mono -> m ()) -> m ()
- forEachWithIndex :: Applicative m => [a] -> ((Int, a) -> m ()) -> m ()
- textToInt :: Text -> Maybe Int
- todayIsWeekend :: IO Bool
- isWeekend :: Day -> Bool
- debug :: Show value => value -> value
- stripTags :: Text -> Text
- symbolToText :: forall symbol. KnownSymbol symbol => Text
- symbolToByteString :: forall symbol. KnownSymbol symbol => ByteString
- allEnumValues :: forall enumType. Enum enumType => [enumType]
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e]
- zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f]
- zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g]
- zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h]
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- concat :: Foldable t => t [a] -> [a]
- catMaybes :: [Maybe a] -> [a]
- catchIOError :: IO a -> (IOError -> IO a) -> IO a
- catch :: Exception e => IO a -> (e -> IO a) -> IO a
- throwIO :: Exception e => e -> IO a
- pluralize :: Text -> Text
- singularize :: Text -> Text
- inflect :: Text -> Int -> Text
- foldl1' :: (a -> a -> a) -> [a] -> a
- iterate' :: (a -> a) -> a -> [a]
- scanl' :: (b -> a -> b) -> b -> [a] -> [b]
- uncons :: [a] -> Maybe (a, [a])
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- isSubsequenceOf :: Eq a => [a] -> [a] -> Bool
- (\\) :: Eq a => [a] -> [a] -> [a]
- deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- dropWhileEnd :: (a -> Bool) -> [a] -> [a]
- elemIndex :: Eq a => a -> [a] -> Maybe Int
- elemIndices :: Eq a => a -> [a] -> [Int]
- findIndex :: (a -> Bool) -> [a] -> Maybe Int
- genericDrop :: Integral i => i -> [a] -> [a]
- genericIndex :: Integral i => [a] -> i -> a
- genericLength :: Num i => [a] -> i
- genericTake :: Integral i => i -> [a] -> [a]
- group :: Eq a => [a] -> [[a]]
- inits :: [a] -> [[a]]
- insert :: Ord a => a -> [a] -> [a]
- insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a]
- intersect :: Eq a => [a] -> [a] -> [a]
- nub :: Eq a => [a] -> [a]
- nubBy :: (a -> a -> Bool) -> [a] -> [a]
- permutations :: [a] -> [[a]]
- singleton :: a -> [a]
- sort :: Ord a => [a] -> [a]
- sortOn :: Ord b => (a -> b) -> [a] -> [a]
- subsequences :: [a] -> [[a]]
- tails :: [a] -> [[a]]
- unfoldr :: (b -> Maybe (a, b)) -> b -> [a]
- union :: Eq a => [a] -> [a] -> [a]
- unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d])
- unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e])
- unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f])
- unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g])
- zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)]
- zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)]
- zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a, b, c, d, e, f)]
- zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a, b, c, d, e, f, g)]
- mapAccumL :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b)
- mapAccumR :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b)
- throw :: forall (r :: RuntimeRep) (a :: TYPE r) e. Exception e => e -> a
- tableNameToModelName :: Text -> Text
- tableNameToControllerName :: Text -> Text
- enumValueToControllerName :: Text -> Text
- modelNameToTableName :: Text -> Text
- columnNameToFieldName :: Text -> Text
- fieldNameToColumnName :: Text -> Text
- humanize :: Text -> Text
- lcfirst :: Text -> Text
- ucfirst :: Text -> Text
- escapeHaskellKeyword :: Text -> Text
- toSlug :: Text -> Text
- fieldNameToFieldLabel :: Text -> Text
- columnNameToFieldLabel :: Text -> Text
- removeIdSuffix :: Text -> Text
- class ToJSON a where
- toJSON :: a -> Value
- toEncoding :: a -> Encoding
- toJSONList :: [a] -> Value
- toEncodingList :: [a] -> Encoding
- class FromJSON a where
- parseJSON :: Value -> Parser a
- parseJSONList :: Value -> Parser [a]
- rnfTyCon :: TyCon -> ()
- trLiftedRep :: TypeRep ('BoxedRep 'Lifted)
- tyConFingerprint :: TyCon -> Fingerprint
- tyConModule :: TyCon -> String
- tyConName :: TyCon -> String
- tyConPackage :: TyCon -> String
- class KeyValue kv where
- data Point = Point {}
- parsePoint :: Parser ByteString Point
- serializePoint :: Point -> Action
- mkNoRepType :: String -> DataType
- data Polygon = Polygon {}
- parsePolygon :: Parser ByteString Polygon
- serializePolygon :: Polygon -> Action
- data PGTimeInterval = PGTimeInterval {}
- newtype PGInterval = PGInterval ByteString
- unpackInterval :: PGInterval -> PGTimeInterval
- pPGInterval :: Parser PGTimeInterval
- twoDigits :: Parser Int
- toPico :: Integer -> Pico
- pClockInterval :: Parser TimeOfDay
- seconds :: Parser Pico
- nominalDiffTime :: Parser NominalDiffTime
- pClockTime :: Parser (Int, Int, Pico)
- data LexemeRanking = LexemeRanking {}
- data Lexeme = Lexeme {
- token :: Text
- ranking :: [LexemeRanking]
- data TSVector = TSVector [Lexeme]
- parseTSVector :: Parser ByteString TSVector
- serializeTSVector :: TSVector -> Action
- class FromRow a
- constrFields :: Constr -> [String]
- constrFixity :: Constr -> Fixity
- constrIndex :: Constr -> ConIndex
- constrRep :: Constr -> ConstrRep
- constrType :: Constr -> DataType
- dataTypeConstrs :: DataType -> [Constr]
- dataTypeName :: DataType -> String
- dataTypeRep :: DataType -> DataRep
- fromConstr :: Data a => Constr -> a
- fromConstrB :: Data a => (forall d. Data d => d) -> Constr -> a
- fromConstrM :: (Monad m, Data a) => (forall d. Data d => m d) -> Constr -> m a
- indexConstr :: DataType -> ConIndex -> Constr
- isAlgType :: DataType -> Bool
- isNorepType :: DataType -> Bool
- maxConstrIndex :: DataType -> ConIndex
- mkCharConstr :: DataType -> Char -> Constr
- mkCharType :: String -> DataType
- mkConstrTag :: DataType -> String -> Int -> [String] -> Fixity -> Constr
- mkDataType :: String -> [Constr] -> DataType
- mkFloatType :: String -> DataType
- mkIntType :: String -> DataType
- mkIntegralConstr :: (Integral a, Show a) => DataType -> a -> Constr
- mkRealConstr :: (Real a, Show a) => DataType -> a -> Constr
- readConstr :: DataType -> String -> Maybe Constr
- repConstr :: DataType -> ConstrRep -> Constr
- showConstr :: Constr -> String
- tyconModule :: String -> String
- tyconUQname :: String -> String
- cast :: (Typeable a, Typeable b) => a -> Maybe b
- eqT :: forall {k} (a :: k) (b :: k). (Typeable a, Typeable b) => Maybe (a :~: b)
- funResultTy :: TypeRep -> TypeRep -> Maybe TypeRep
- gcast :: forall {k} (a :: k) (b :: k) c. (Typeable a, Typeable b) => c a -> Maybe (c b)
- gcast1 :: forall {k1} {k2} c (t :: k2 -> k1) (t' :: k2 -> k1) (a :: k2). (Typeable t, Typeable t') => c (t a) -> Maybe (c (t' a))
- gcast2 :: forall {k1} {k2} {k3} c (t :: k2 -> k3 -> k1) (t' :: k2 -> k3 -> k1) (a :: k2) (b :: k3). (Typeable t, Typeable t') => c (t a b) -> Maybe (c (t' a b))
- mkFunTy :: TypeRep -> TypeRep -> TypeRep
- rnfTypeRep :: TypeRep -> ()
- showsTypeRep :: TypeRep -> ShowS
- splitTyConApp :: TypeRep -> (TyCon, [TypeRep])
- typeOf :: Typeable a => a -> TypeRep
- typeOf1 :: Typeable t => t a -> TypeRep
- typeOf2 :: Typeable t => t a b -> TypeRep
- typeOf3 :: Typeable t => t a b c -> TypeRep
- typeOf4 :: Typeable t => t a b c d -> TypeRep
- typeOf5 :: Typeable t => t a b c d e -> TypeRep
- typeOf6 :: Typeable t => t a b c d e f -> TypeRep
- typeOf7 :: Typeable t => t a b c d e f g -> TypeRep
- typeRep :: forall {k} proxy (a :: k). Typeable a => proxy a -> TypeRep
- typeRepArgs :: TypeRep -> [TypeRep]
- typeRepFingerprint :: TypeRep -> Fingerprint
- typeRepTyCon :: TypeRep -> TyCon
- type ConIndex = Int
- type TypeRep = SomeTypeRep
- data EnhancedSqlError = EnhancedSqlError {
- sqlErrorQuery :: Query
- sqlErrorQueryParams :: [Action]
- sqlError :: SqlError
- data RecordNotFoundException = RecordNotFoundException {
- queryAndParams :: (ByteString, [Action])
- data FieldWithUpdate name value
- data FieldWithDefault valueType
- = Default
- | NonDefault valueType
- data MetaBag = MetaBag {
- annotations :: ![(Text, Violation)]
- touchedFields :: ![Text]
- originalDatabaseRecord :: Maybe Dynamic
- data Violation
- = TextViolation { }
- | HtmlViolation { }
- type NormalizeModel model = GetModelByTableName (GetTableName model)
- class Record model where
- newRecord :: model
- type family Include' (name :: [Symbol]) model where ...
- type family Include (name :: Symbol) model
- class KnownSymbol (GetTableName record) => Table record where
- tableName :: Text
- tableNameByteString :: ByteString
- columnNames :: [ByteString]
- primaryKeyCondition :: record -> [(Text, Action)]
- class ParsePrimaryKey primaryKey where
- parsePrimaryKey :: Text -> Maybe primaryKey
- data LabeledData a b = LabeledData {
- labelValue :: a
- contentValue :: b
- type Id model = Id' (GetTableName model)
- newtype Id' table = Id (PrimaryKey table)
- type family PrimaryKey (tableName :: Symbol)
- type family GetModelName model :: Symbol
- type FieldName = ByteString
- class InputValue a where
- inputValue :: a -> Text
- class CanUpdate a where
- updateRecord :: (?modelContext :: ModelContext) => a -> IO a
- class CanCreate a where
- create :: (?modelContext :: ModelContext) => a -> IO a
- createMany :: (?modelContext :: ModelContext) => [a] -> IO [a]
- type family GetModelByTableName (tableName :: Symbol) :: Type
- type family GetTableName model :: Symbol
- type family GetModelById id :: Type where ...
- data RowLevelSecurityContext = RowLevelSecurityContext {
- rlsAuthenticatedRole :: Text
- rlsUserId :: Action
- data ModelContext = ModelContext {
- connectionPool :: Pool Connection
- transactionConnection :: Maybe Connection
- logger :: Logger
- trackTableReadCallback :: Maybe (ByteString -> IO ())
- rowLevelSecurity :: Maybe RowLevelSecurityContext
- notConnectedModelContext :: Logger -> ModelContext
- createModelContext :: NominalDiffTime -> Int -> ByteString -> Logger -> IO ModelContext
- createRecord :: (?modelContext :: ModelContext, CanCreate model) => model -> IO model
- isNew :: forall model. HasField "meta" model MetaBag => model -> Bool
- getModelName :: forall model. KnownSymbol (GetModelName model) => Text
- recordToInputValue :: (HasField "id" entity (Id entity), Show (PrimaryKey (GetTableName entity))) => entity -> Text
- packId :: PrimaryKey model -> Id' model
- unpackId :: Id' model -> PrimaryKey model
- textToId :: (HasCallStack, ParsePrimaryKey (PrimaryKey model), ConvertibleStrings text Text) => text -> Id' model
- measureTimeIfLogging :: (?modelContext :: ModelContext, ToRow q) => IO a -> Query -> q -> IO a
- sqlQuery :: (?modelContext :: ModelContext, ToRow q, FromRow r) => Query -> q -> IO [r]
- sqlExec :: (?modelContext :: ModelContext, ToRow q) => Query -> q -> IO Int64
- withRLSParams :: (?modelContext :: ModelContext, ToRow params) => (Query -> [Action] -> result) -> Query -> params -> result
- withDatabaseConnection :: (?modelContext :: ModelContext) => (Connection -> IO a) -> IO a
- sqlQueryScalar :: (?modelContext :: ModelContext) => (ToRow q, FromField value) => Query -> q -> IO value
- sqlQueryScalarOrNothing :: (?modelContext :: ModelContext) => (ToRow q, FromField value) => Query -> q -> IO (Maybe value)
- withTransaction :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a
- withRowLevelSecurityDisabled :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a
- transactionConnectionOrError :: (?modelContext :: ModelContext) => Connection
- commitTransaction :: (?modelContext :: ModelContext) => IO ()
- rollbackTransaction :: (?modelContext :: ModelContext) => IO ()
- withTransactionConnection :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a
- logQuery :: (?modelContext :: ModelContext, ToRow parameters) => Query -> parameters -> NominalDiffTime -> IO ()
- deleteRecord :: forall record table. (?modelContext :: ModelContext, Show (PrimaryKey table), Table record, HasField "id" record (Id' table), ToField (PrimaryKey table), GetModelByTableName table ~ record, Show (PrimaryKey table), ToField (PrimaryKey table)) => record -> IO ()
- deleteRecordById :: forall record table. (?modelContext :: ModelContext, Table record, ToField (PrimaryKey table), Show (PrimaryKey table), record ~ GetModelByTableName table) => Id' table -> IO ()
- deleteRecords :: forall record table. (?modelContext :: ModelContext, Show (PrimaryKey table), Table record, HasField "id" record (Id' table), ToField (PrimaryKey table), record ~ GetModelByTableName table) => [record] -> IO ()
- deleteRecordByIds :: forall record table. (?modelContext :: ModelContext, Show (PrimaryKey table), Table record, ToField (PrimaryKey table), record ~ GetModelByTableName table) => [Id' table] -> IO ()
- deleteAll :: forall record. (?modelContext :: ModelContext, Table record) => IO ()
- ids :: HasField "id" record id => [record] -> [id]
- didChangeRecord :: HasField "meta" record MetaBag => record -> Bool
- didChange :: forall fieldName fieldValue record. (KnownSymbol fieldName, HasField fieldName record fieldValue, HasField "meta" record MetaBag, Eq fieldValue, Typeable record) => Proxy fieldName -> record -> Bool
- fieldWithDefault :: (KnownSymbol name, HasField name model value, HasField "meta" model MetaBag) => Proxy name -> model -> FieldWithDefault value
- fieldWithUpdate :: (KnownSymbol name, HasField name model value, HasField "meta" model MetaBag) => Proxy name -> model -> FieldWithUpdate name value
- enhanceSqlError :: ToRow parameters => Query -> parameters -> IO a -> IO a
- trackTableRead :: (?modelContext :: ModelContext) => ByteString -> IO ()
- withTableReadTracker :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext, ?touchedTables :: IORef (Set ByteString)) => IO ()) -> IO ()
- onlyWhere :: forall record fieldName value. (KnownSymbol fieldName, HasField fieldName record value, Eq value) => Proxy fieldName -> value -> [record] -> [record]
- onlyWhereReferences :: forall record fieldName value referencedRecord. (KnownSymbol fieldName, HasField fieldName record value, Eq value, HasField "id" referencedRecord value) => Proxy fieldName -> referencedRecord -> [record] -> [record]
- onlyWhereReferencesMaybe :: forall record fieldName value referencedRecord. (KnownSymbol fieldName, HasField fieldName record (Maybe value), Eq value, HasField "id" referencedRecord value) => Proxy fieldName -> referencedRecord -> [record] -> [record]
- atomicModifyIORef' :: IORef a -> (a -> (a, b)) -> IO b
- newIORef :: a -> IO (IORef a)
- readIORef :: IORef a -> IO a
- writeIORef :: IORef a -> a -> IO ()
- putStr :: Text -> IO ()
- putStrLn :: Text -> IO ()
- type TMap = TypeRepMap Identity
- atomicModifyIORef :: IORef a -> (a -> (a, b)) -> IO b
- atomicWriteIORef :: IORef a -> a -> IO ()
- mkWeakIORef :: IORef a -> IO () -> IO (Weak (IORef a))
- modifyIORef :: IORef a -> (a -> a) -> IO ()
- modifyIORef' :: IORef a -> (a -> a) -> IO ()
- async :: IO a -> IO (Async a)
- asyncBound :: IO a -> IO (Async a)
- asyncOn :: Int -> IO a -> IO (Async a)
- asyncOnWithUnmask :: Int -> ((forall b. IO b -> IO b) -> IO a) -> IO (Async a)
- asyncWithUnmask :: ((forall b. IO b -> IO b) -> IO a) -> IO (Async a)
- cancel :: Async a -> IO ()
- cancelWith :: Exception e => Async a -> e -> IO ()
- compareAsyncs :: Async a -> Async b -> Ordering
- concurrently :: IO a -> IO b -> IO (a, b)
- concurrently_ :: IO a -> IO b -> IO ()
- forConcurrently :: Traversable t => t a -> (a -> IO b) -> IO (t b)
- forConcurrently_ :: Foldable f => f a -> (a -> IO b) -> IO ()
- link :: Async a -> IO ()
- link2 :: Async a -> Async b -> IO ()
- link2Only :: (SomeException -> Bool) -> Async a -> Async b -> IO ()
- linkOnly :: (SomeException -> Bool) -> Async a -> IO ()
- mapConcurrently :: Traversable t => (a -> IO b) -> t a -> IO (t b)
- mapConcurrently_ :: Foldable f => (a -> IO b) -> f a -> IO ()
- poll :: Async a -> IO (Maybe (Either SomeException a))
- race :: IO a -> IO b -> IO (Either a b)
- race_ :: IO a -> IO b -> IO ()
- replicateConcurrently :: Int -> IO a -> IO [a]
- replicateConcurrently_ :: Int -> IO a -> IO ()
- uninterruptibleCancel :: Async a -> IO ()
- wait :: Async a -> IO a
- waitAny :: [Async a] -> IO (Async a, a)
- waitAnyCancel :: [Async a] -> IO (Async a, a)
- waitAnyCatch :: [Async a] -> IO (Async a, Either SomeException a)
- waitAnyCatchCancel :: [Async a] -> IO (Async a, Either SomeException a)
- waitBoth :: Async a -> Async b -> IO (a, b)
- waitCatch :: Async a -> IO (Either SomeException a)
- waitEither :: Async a -> Async b -> IO (Either a b)
- waitEitherCancel :: Async a -> Async b -> IO (Either a b)
- waitEitherCatch :: Async a -> Async b -> IO (Either (Either SomeException a) (Either SomeException b))
- waitEitherCatchCancel :: Async a -> Async b -> IO (Either (Either SomeException a) (Either SomeException b))
- waitEither_ :: Async a -> Async b -> IO ()
- withAsync :: IO a -> (Async a -> IO b) -> IO b
- withAsyncBound :: IO a -> (Async a -> IO b) -> IO b
- withAsyncOn :: Int -> IO a -> (Async a -> IO b) -> IO b
- withAsyncOnWithUnmask :: Int -> ((forall c. IO c -> IO c) -> IO a) -> (Async a -> IO b) -> IO b
- withAsyncWithUnmask :: ((forall c. IO c -> IO c) -> IO a) -> (Async a -> IO b) -> IO b
- newtype Concurrently a = Concurrently {
- runConcurrently :: IO a
- data ExceptionInLinkedThread = ExceptionInLinkedThread (Async a) SomeException
- trimming :: QuasiQuoter
- (++) :: Semigroup a => a -> a -> a
- tshow :: Show a => a -> Text
- show :: Show a => a -> Text
- error :: Text -> a
- head :: [a] -> Maybe a
- headMay :: [a] -> Maybe a
- last :: [a] -> Maybe a
- lastMay :: [a] -> Maybe a
- tail :: [a] -> Maybe [a]
- tailMay :: [a] -> Maybe [a]
- init :: [a] -> Maybe [a]
- initMay :: [a] -> Maybe [a]
- plain :: QuasiQuoter
- data PageDotDot
- data Options = Options {
- maxItems :: Int
- windowSize :: Int
- data Pagination = Pagination {
- pageSize :: Int
- totalItems :: Int
- currentPage :: Int
- window :: Int
- preEscapedToHtml :: ToMarkup a => a -> Html
- preEscapedTextValue :: Text -> AttributeValue
- stringValue :: String -> AttributeValue
- (!) :: Attributable h => h -> Attribute -> h
- newtype ModalContainer = ModalContainer Html
- data Modal = Modal {
- modalContent :: Html
- modalFooter :: Maybe Html
- modalCloseUrl :: Text
- modalTitle :: Text
- data BreadcrumbItem = BreadcrumbItem {
- breadcrumbLabel :: Html
- url :: Maybe Text
- toHtml :: ToHtml a => a -> Html
- data ValidatorResult
- = Success
- | Failure !Text
- | FailureHtml !Text
- isSuccess :: ValidatorResult -> Bool
- isFailure :: ValidatorResult -> Bool
- attachValidatorResult :: (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> ValidatorResult -> model -> model
- attachFailure :: (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Text -> model -> model
- attachFailureHtml :: (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Html -> model -> model
- getValidationFailure :: (KnownSymbol field, HasField "meta" model MetaBag) => Proxy field -> model -> Maybe Text
- getValidationViolation :: (KnownSymbol field, HasField "meta" model MetaBag) => Proxy field -> model -> Maybe Violation
- validateCanView :: forall field user model validationState fieldValue fetchedModel. (?model :: model, ?modelContext :: ModelContext, FromRow fetchedModel, KnownSymbol field, HasField field model fieldValue, Fetchable fieldValue fetchedModel, CanView user fetchedModel, ValidateCanView' fieldValue fetchedModel, HasField "meta" user MetaBag, SetField "meta" user MetaBag, Table fetchedModel) => Proxy field -> user -> IO user
- type ValidatorIO value = value -> IO ValidatorResult
- type Validator valueType = valueType -> ValidatorResult
- validateField :: forall field fieldValue model. (KnownSymbol field, HasField field model fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Validator fieldValue -> model -> model
- validateFieldIO :: forall field model fieldValue. (?modelContext :: ModelContext, KnownSymbol field, HasField field model fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> ValidatorIO fieldValue -> model -> IO model
- withCustomErrorMessage :: Text -> (value -> ValidatorResult) -> value -> ValidatorResult
- validateAny :: [value -> ValidatorResult] -> value -> ValidatorResult
- validateAll :: [value -> ValidatorResult] -> value -> ValidatorResult
- nonEmpty :: IsEmpty value => value -> ValidatorResult
- isEmptyValue :: IsEmpty value => value -> ValidatorResult
- isPhoneNumber :: Text -> ValidatorResult
- isEmail :: Text -> ValidatorResult
- isInRange :: (Show value, Ord value) => (value, value) -> value -> ValidatorResult
- isLessThan :: (Show value, Ord value) => value -> value -> ValidatorResult
- isGreaterThan :: (Show value, Ord value) => value -> value -> ValidatorResult
- hasMaxLength :: Int -> Text -> ValidatorResult
- hasMinLength :: Int -> Text -> ValidatorResult
- isRgbHexColor :: Text -> ValidatorResult
- isRgbaHexColor :: Text -> ValidatorResult
- isHexColor :: Text -> ValidatorResult
- isRgbColor :: Text -> ValidatorResult
- isRgbaColor :: Text -> ValidatorResult
- isColor :: Text -> ValidatorResult
- isUrl :: Text -> ValidatorResult
- isInList :: (Eq value, Show value) => [value] -> value -> ValidatorResult
- isTrue :: Bool -> ValidatorResult
- isFalse :: Bool -> ValidatorResult
- matchesRegex :: Text -> Text -> ValidatorResult
- isSlug :: Text -> ValidatorResult
- validateIsUnique :: forall field model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel, Table savedModel) => Proxy field -> model -> IO model
- validateIsUniqueCaseInsensitive :: forall field model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel, Table savedModel) => Proxy field -> model -> IO model
- withCustomErrorMessageIO :: forall field model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel) => Text -> (Proxy field -> model -> IO model) -> Proxy field -> model -> IO model
- classes :: [(Text, Bool)] -> Text
- timeAgo :: UTCTime -> Html
- dateTime :: UTCTime -> Html
- date :: UTCTime -> Html
- time :: UTCTime -> Html
- data CSSFramework = CSSFramework {
- styledFlashMessage :: CSSFramework -> FlashMessage -> Html
- styledFlashMessages :: CSSFramework -> [FlashMessage] -> Html
- styledFormField :: CSSFramework -> FormField -> Html
- styledTextFormField :: CSSFramework -> Text -> FormField -> Html -> Html
- styledTextareaFormField :: CSSFramework -> FormField -> Html -> Html
- styledCheckboxFormField :: CSSFramework -> FormField -> Html -> Html
- styledSelectFormField :: CSSFramework -> FormField -> Html -> Html
- styledFormGroup :: CSSFramework -> Text -> Html -> Html
- styledSubmitButton :: CSSFramework -> SubmitButton -> Html
- styledSubmitButtonClass :: Text
- styledFormFieldHelp :: CSSFramework -> FormField -> Html
- styledInputClass :: CSSFramework -> FormField -> Text
- styledInputInvalidClass :: CSSFramework -> FormField -> Text
- styledFormGroupClass :: Text
- styledValidationResult :: CSSFramework -> FormField -> Html
- styledValidationResultClass :: Text
- styledPagination :: CSSFramework -> PaginationView -> Html
- styledPaginationLinkPrevious :: CSSFramework -> Pagination -> ByteString -> Html
- styledPaginationLinkNext :: CSSFramework -> Pagination -> ByteString -> Html
- styledPaginationPageLink :: CSSFramework -> Pagination -> ByteString -> Int -> Html
- styledPaginationDotDot :: CSSFramework -> Pagination -> Html
- styledPaginationItemsPerPageSelector :: CSSFramework -> Pagination -> (Int -> ByteString) -> Html
- styledBreadcrumb :: CSSFramework -> [BreadcrumbItem] -> BreadcrumbsView -> Html
- styledBreadcrumbItem :: CSSFramework -> [BreadcrumbItem] -> BreadcrumbItem -> Bool -> Html
- data PaginationView = PaginationView {
- cssFramework :: !CSSFramework
- pagination :: !Pagination
- pageUrl :: Int -> ByteString
- linkPrevious :: !Html
- linkNext :: !Html
- pageDotDotItems :: !Html
- itemsPerPageSelector :: !Html
- data BreadcrumbsView = BreadcrumbsView {
- breadcrumbItems :: !Html
- data InputType
- data FormContext model = FormContext {
- model :: model
- formAction :: !Text
- formMethod :: !Text
- cssFramework :: !CSSFramework
- formClass :: !Text
- formId :: !Text
- disableJavascriptSubmission :: !Bool
- customFormAttributes :: ![(Text, Text)]
- data SubmitButton = SubmitButton {
- label :: Html
- buttonClass :: Text
- cssFramework :: CSSFramework
- data FormField = FormField {
- fieldType :: !InputType
- fieldName :: !Text
- fieldLabel :: !Text
- fieldValue :: !Text
- fieldInputId :: !Text
- validatorResult :: !(Maybe Violation)
- additionalAttributes :: [(Text, Text)]
- fieldClass :: !Text
- labelClass :: !Text
- disabled :: !Bool
- disableLabel :: !Bool
- disableGroup :: !Bool
- disableValidationResult :: !Bool
- cssFramework :: CSSFramework
- helpText :: !Text
- placeholder :: !Text
- required :: Bool
- autofocus :: Bool
- type Layout = Html -> Html
- type HtmlWithContext context = (?context :: context) => Html
- hsx :: QuasiQuoter
- data ExceptionWithCallStack = ExceptionWithCallStack CallStack SomeException
- data RootApplication = RootApplication
- type ConfigProvider context = HasField "frameworkConfig" context FrameworkConfig
- data FrameworkConfig = FrameworkConfig {
- appHostname :: !Text
- environment :: !Environment
- appPort :: !Int
- baseUrl :: !Text
- requestLoggerMiddleware :: !Middleware
- sessionCookie :: !SetCookie
- mailServer :: !MailServer
- databaseUrl :: !ByteString
- dbPoolIdleTime :: !NominalDiffTime
- dbPoolMaxConnections :: !Int
- cssFramework :: !CSSFramework
- logger :: !Logger
- exceptionTracker :: !ExceptionTracker
- appConfig :: !TMap
- corsResourcePolicy :: Maybe CorsResourcePolicy
- parseRequestBodyOptions :: ParseRequestBodyOptions
- ideBaseUrl :: Text
- rlsAuthenticatedRole :: Text
- assetVersion :: !Text
- customMiddleware :: !CustomMiddleware
- class EnvVarReader valueType where
- envStringToValue :: ByteString -> Either Text valueType
- newtype DataSyncMaxTransactionsPerConnection = DataSyncMaxTransactionsPerConnection Int
- newtype DataSyncMaxSubscriptionsPerConnection = DataSyncMaxSubscriptionsPerConnection Int
- newtype CustomMiddleware = CustomMiddleware Middleware
- newtype AssetVersion = AssetVersion Text
- newtype RLSAuthenticatedRole = RLSAuthenticatedRole Text
- newtype IdeBaseUrl = IdeBaseUrl Text
- newtype ExceptionTracker = ExceptionTracker {
- onException :: Maybe Request -> SomeException -> IO ()
- type ConfigBuilder = StateT TMap IO ()
- newtype DatabaseUrl = DatabaseUrl ByteString
- newtype DBPoolMaxConnections = DBPoolMaxConnections Int
- newtype DBPoolIdleTime = DBPoolIdleTime NominalDiffTime
- newtype SessionCookie = SessionCookie SetCookie
- newtype RequestLoggerMiddleware = RequestLoggerMiddleware Middleware
- newtype BaseUrl = BaseUrl Text
- newtype AppPort = AppPort Int
- newtype AppHostname = AppHostname Text
- option :: forall option. Typeable option => option -> StateT TMap IO ()
- ihpDefaultConfig :: ConfigBuilder
- env :: forall result monad. MonadIO monad => EnvVarReader result => ByteString -> monad result
- envOrDefault :: MonadIO monad => EnvVarReader result => ByteString -> result -> monad result
- envOrNothing :: MonadIO monad => EnvVarReader result => ByteString -> monad (Maybe result)
- initAssetVersion :: ConfigBuilder
- findOption :: forall option. Typeable option => StateT TMap IO option
- findOptionOrNothing :: forall option. Typeable option => StateT TMap IO (Maybe option)
- buildFrameworkConfig :: ConfigBuilder -> IO FrameworkConfig
- defaultIHPSessionCookie :: Text -> SetCookie
- defaultPort :: Int
- defaultDatabaseUrl :: HasCallStack => IO ByteString
- defaultLoggerForEnv :: HasCallStack => Environment -> IO Logger
- isEnvironment :: (?context :: context, ConfigProvider context) => Environment -> Bool
- isDevelopment :: (?context :: context, ConfigProvider context) => Bool
- isProduction :: (?context :: context, ConfigProvider context) => Bool
- defaultCorsResourcePolicy :: Maybe CorsResourcePolicy
- withFrameworkConfig :: ConfigBuilder -> (FrameworkConfig -> IO result) -> IO result
- initModelContext :: FrameworkConfig -> IO ModelContext
- configIO :: (MonadIO monad, HasCallStack) => IO result -> monad result
- data JobWorkerProcessMessage
- = JobAvailable
- | Stop
- data JobWorkerProcess = JobWorkerProcess {
- runners :: [Async ()]
- subscription :: Subscription
- poller :: Async ()
- action :: MVar JobWorkerProcessMessage
- data JobStatus
- newtype JobWorker = JobWorker (JobWorkerArgs -> IO JobWorkerProcess)
- data JobWorkerArgs = JobWorkerArgs {}
- class Worker application where
- class Job job where
- perform :: (?modelContext :: ModelContext, ?context :: FrameworkConfig) => job -> IO ()
- maxAttempts :: (?job :: job) => Int
- timeoutInMicroseconds :: (?job :: job) => Maybe Int
- queuePollInterval :: Int
- maxConcurrency :: Int
- newtype ActionType = ActionType TypeRep
- data ControllerContext
- newControllerContext :: (?requestContext :: RequestContext) => IO ControllerContext
- freeze :: ControllerContext -> IO ControllerContext
- unfreeze :: ControllerContext -> IO ControllerContext
- fromContext :: forall value. (?context :: ControllerContext, Typeable value) => IO value
- fromFrozenContext :: forall value. (?context :: ControllerContext, Typeable value) => value
- maybeFromContext :: forall value. (?context :: ControllerContext, Typeable value) => IO (Maybe value)
- maybeFromFrozenContext :: forall value. (?context :: ControllerContext, Typeable value) => Maybe value
- putContext :: forall value. (?context :: ControllerContext, Typeable value) => value -> IO ()
- setTitle :: (?context :: ControllerContext) => Text -> IO ()
- setDescription :: (?context :: ControllerContext) => Text -> IO ()
- setOGTitle :: (?context :: ControllerContext) => Text -> IO ()
- setOGType :: (?context :: ControllerContext) => Text -> IO ()
- setOGDescription :: (?context :: ControllerContext) => Text -> IO ()
- setOGUrl :: (?context :: ControllerContext) => Text -> IO ()
- setOGImage :: (?context :: ControllerContext) => Text -> IO ()
- pageTitle :: (?context :: ControllerContext) => Text
- pageTitleOrDefault :: (?context :: ControllerContext) => Text -> Text
- pageTitleOrNothing :: (?context :: ControllerContext) => Maybe Text
- ogTitleOrDefault :: (?context :: ControllerContext) => Text -> Html
- descriptionOrDefault :: (?context :: ControllerContext) => Text -> Html
- ogTypeOrDefault :: (?context :: ControllerContext) => Text -> Html
- ogDescriptionOrDefault :: (?context :: ControllerContext) => Text -> Html
- ogUrl :: (?context :: ControllerContext) => Html
- ogImage :: (?context :: ControllerContext) => Html
- renderModal :: Modal -> Html
- modal :: (?context :: ControllerContext) => Html
- autoRefreshMeta :: (?context :: ControllerContext) => Html
- assetPath :: (?context :: ControllerContext) => Text -> Text
- assetVersion :: (?context :: ControllerContext) => Text
- pathTo :: HasPath controller => controller -> Text
- urlTo :: (?context :: context, ConfigProvider context, HasPath action) => action -> Text
- type Html = HtmlWithContext ControllerContext
- class ViewFetchHelpMessage where
- param :: ViewParamHelpMessage => a
- class View theView where
- beforeRender :: (?context :: ControllerContext) => theView -> IO ()
- json :: theView -> Value
- currentViewId :: (?view :: view, Typeable view) => Text
- isActivePath :: (?context :: ControllerContext, PathString controller) => controller -> Bool
- isActivePathOrSub :: (?context :: ControllerContext, PathString controller) => controller -> Bool
- isActiveController :: forall controller. (?context :: ControllerContext, Typeable controller) => Bool
- isActiveAction :: forall controllerAction. (?context :: ControllerContext, HasPath controllerAction) => controllerAction -> Bool
- css :: QuasiQuoter
- onClick :: AttributeValue -> Attribute
- onLoad :: AttributeValue -> Attribute
- theRequest :: (?context :: ControllerContext) => Request
- viewContext :: (?context :: ControllerContext) => ControllerContext
- addStyle :: ConvertibleStrings string Text => string -> Markup
- fromCSSFramework :: (?context :: ControllerContext, KnownSymbol field, HasField field CSSFramework (CSSFramework -> appliedFunction)) => Proxy field -> appliedFunction
- theCSSFramework :: (?context :: ControllerContext) => CSSFramework
- nl2br :: (Textual text, ToHtml text) => text -> Html
- liveReloadWebsocketUrl :: (?context :: ControllerContext) => Text
- class ModelFormAction record where
- modelFormAction :: (?context :: ControllerContext) => record -> Text
- class CanSelect model where
- type SelectValue model :: Type
- selectLabel :: model -> Text
- selectValue :: model -> SelectValue model
- formFor :: forall record. (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- formForWithOptions :: forall record. (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> (FormContext record -> FormContext record) -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- formForWithoutJavascript :: forall record. (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- formFor' :: forall record. (?context :: ControllerContext, HasField "meta" record MetaBag) => record -> Text -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- createFormContext :: forall record. (?context :: ControllerContext, HasField "meta" record MetaBag) => record -> FormContext record
- buildForm :: forall model. (?context :: ControllerContext) => FormContext model -> ((?context :: ControllerContext, ?formContext :: FormContext model) => Html) -> Html
- submitButton :: forall model. (?formContext :: FormContext model, HasField "meta" model MetaBag, KnownSymbol (GetModelName model)) => SubmitButton
- textField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- numberField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- textareaField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- colorField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- emailField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model), InputValue value) => Proxy fieldName -> FormField
- dateField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- passwordField :: forall fieldName model. (?formContext :: FormContext model, HasField fieldName model Text, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- dateTimeField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- hiddenField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- fileField :: forall fieldName model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- checkboxField :: forall fieldName model. (?formContext :: FormContext model, HasField fieldName model Bool, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField
- selectField :: forall fieldName model item. (?formContext :: FormContext model, HasField fieldName model (SelectValue item), HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model), CanSelect item, InputValue (SelectValue item)) => Proxy fieldName -> [item] -> FormField
- validationResult :: forall fieldName model fieldType. (?formContext :: FormContext model, HasField fieldName model fieldType, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue fieldType, KnownSymbol (GetModelName model)) => Proxy fieldName -> Html
- validationResultMaybe :: forall fieldName model fieldType. (?formContext :: FormContext model, HasField fieldName model fieldType, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> Maybe Text
- renderFlashMessages :: (?context :: ControllerContext) => Html
- newtype ViewLayout = ViewLayout ((?context :: ControllerContext) => Layout)
- setLayout :: (?context :: ControllerContext) => ((?context :: ControllerContext) => Layout) -> IO ()
- getLayout :: (?context :: ControllerContext) => IO Layout
- renderPagination :: (?context :: ControllerContext) => Pagination -> Html
- renderFilter :: (?context :: ControllerContext) => Text -> Html
- currentUser :: (?context :: ControllerContext, user ~ CurrentUserRecord, Typeable user) => user
- currentUserId :: forall user userId. (?context :: ControllerContext, HasField "id" user userId, Typeable user, user ~ CurrentUserRecord) => userId
- currentUserOrNothing :: forall user. (?context :: ControllerContext, user ~ CurrentUserRecord, Typeable user) => Maybe user
- currentAdmin :: (?context :: ControllerContext, admin ~ CurrentAdminRecord, Typeable admin) => admin
- currentAdminOrNothing :: forall admin. (?context :: ControllerContext, admin ~ CurrentAdminRecord, Typeable admin) => Maybe admin
- renderBreadcrumb :: (?context :: ControllerContext) => [BreadcrumbItem] -> Html
- breadcrumbLink :: HasPath controller => Html -> controller -> BreadcrumbItem
- breadcrumbLinkExternal :: Html -> Text -> BreadcrumbItem
- breadcrumbText :: Html -> BreadcrumbItem
- module IHP.Mail.Types
Documentation
module IHP.Mail
fromIntegral :: (Integral a, Num b) => a -> b #
realToFrac :: (Real a, Fractional b) => a -> b #
Instances
Methods
enumFromThen :: a -> a -> [a] #
enumFromTo :: a -> a -> [a] #
enumFromThenTo :: a -> a -> a -> [a] #
Instances
Enum Arity | |
Defined in Data.Aeson.TH | |
Enum CBool | |
Defined in Foreign.C.Types | |
Enum CChar | |
Defined in Foreign.C.Types | |
Enum CClock | |
Defined in Foreign.C.Types | |
Enum CDouble | |
Defined in Foreign.C.Types Methods enumFrom :: CDouble -> [CDouble] # enumFromThen :: CDouble -> CDouble -> [CDouble] # enumFromTo :: CDouble -> CDouble -> [CDouble] # enumFromThenTo :: CDouble -> CDouble -> CDouble -> [CDouble] # | |
Enum CFloat | |
Defined in Foreign.C.Types | |
Enum CInt | |
Defined in Foreign.C.Types | |
Enum CIntMax | |
Defined in Foreign.C.Types Methods enumFrom :: CIntMax -> [CIntMax] # enumFromThen :: CIntMax -> CIntMax -> [CIntMax] # enumFromTo :: CIntMax -> CIntMax -> [CIntMax] # enumFromThenTo :: CIntMax -> CIntMax -> CIntMax -> [CIntMax] # | |
Enum CIntPtr | |
Defined in Foreign.C.Types Methods enumFrom :: CIntPtr -> [CIntPtr] # enumFromThen :: CIntPtr -> CIntPtr -> [CIntPtr] # enumFromTo :: CIntPtr -> CIntPtr -> [CIntPtr] # enumFromThenTo :: CIntPtr -> CIntPtr -> CIntPtr -> [CIntPtr] # | |
Enum CLLong | |
Defined in Foreign.C.Types | |
Enum CLong | |
Defined in Foreign.C.Types | |
Enum CPtrdiff | |
Defined in Foreign.C.Types Methods succ :: CPtrdiff -> CPtrdiff # pred :: CPtrdiff -> CPtrdiff # enumFrom :: CPtrdiff -> [CPtrdiff] # enumFromThen :: CPtrdiff -> CPtrdiff -> [CPtrdiff] # enumFromTo :: CPtrdiff -> CPtrdiff -> [CPtrdiff] # enumFromThenTo :: CPtrdiff -> CPtrdiff -> CPtrdiff -> [CPtrdiff] # | |
Enum CSChar | |
Defined in Foreign.C.Types | |
Enum CSUSeconds | |
Defined in Foreign.C.Types Methods succ :: CSUSeconds -> CSUSeconds # pred :: CSUSeconds -> CSUSeconds # fromEnum :: CSUSeconds -> Int # enumFrom :: CSUSeconds -> [CSUSeconds] # enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds] # | |
Enum CShort | |
Defined in Foreign.C.Types | |
Enum CSigAtomic | |
Defined in Foreign.C.Types Methods succ :: CSigAtomic -> CSigAtomic # pred :: CSigAtomic -> CSigAtomic # fromEnum :: CSigAtomic -> Int # enumFrom :: CSigAtomic -> [CSigAtomic] # enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic] # | |
Enum CSize | |
Defined in Foreign.C.Types | |
Enum CTime | |
Defined in Foreign.C.Types | |
Enum CUChar | |
Defined in Foreign.C.Types | |
Enum CUInt | |
Defined in Foreign.C.Types | |
Enum CUIntMax | |
Defined in Foreign.C.Types Methods succ :: CUIntMax -> CUIntMax # pred :: CUIntMax -> CUIntMax # enumFrom :: CUIntMax -> [CUIntMax] # enumFromThen :: CUIntMax -> CUIntMax -> [CUIntMax] # enumFromTo :: CUIntMax -> CUIntMax -> [CUIntMax] # enumFromThenTo :: CUIntMax -> CUIntMax -> CUIntMax -> [CUIntMax] # | |
Enum CUIntPtr | |
Defined in Foreign.C.Types Methods succ :: CUIntPtr -> CUIntPtr # pred :: CUIntPtr -> CUIntPtr # enumFrom :: CUIntPtr -> [CUIntPtr] # enumFromThen :: CUIntPtr -> CUIntPtr -> [CUIntPtr] # enumFromTo :: CUIntPtr -> CUIntPtr -> [CUIntPtr] # enumFromThenTo :: CUIntPtr -> CUIntPtr -> CUIntPtr -> [CUIntPtr] # | |
Enum CULLong | |
Defined in Foreign.C.Types Methods enumFrom :: CULLong -> [CULLong] # enumFromThen :: CULLong -> CULLong -> [CULLong] # enumFromTo :: CULLong -> CULLong -> [CULLong] # enumFromThenTo :: CULLong -> CULLong -> CULLong -> [CULLong] # | |
Enum CULong | |
Defined in Foreign.C.Types | |
Enum CUSeconds | |
Defined in Foreign.C.Types Methods succ :: CUSeconds -> CUSeconds # pred :: CUSeconds -> CUSeconds # fromEnum :: CUSeconds -> Int # enumFrom :: CUSeconds -> [CUSeconds] # enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds] # | |
Enum CUShort | |
Defined in Foreign.C.Types Methods enumFrom :: CUShort -> [CUShort] # enumFromThen :: CUShort -> CUShort -> [CUShort] # enumFromTo :: CUShort -> CUShort -> [CUShort] # enumFromThenTo :: CUShort -> CUShort -> CUShort -> [CUShort] # | |
Enum CWchar | |
Defined in Foreign.C.Types | |
Enum ByteOrder | |
Defined in GHC.ByteOrder Methods succ :: ByteOrder -> ByteOrder # pred :: ByteOrder -> ByteOrder # fromEnum :: ByteOrder -> Int # enumFrom :: ByteOrder -> [ByteOrder] # enumFromThen :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromTo :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromThenTo :: ByteOrder -> ByteOrder -> ByteOrder -> [ByteOrder] # | |
Enum Associativity | |
Defined in GHC.Generics Methods succ :: Associativity -> Associativity # pred :: Associativity -> Associativity # toEnum :: Int -> Associativity # fromEnum :: Associativity -> Int # enumFrom :: Associativity -> [Associativity] # enumFromThen :: Associativity -> Associativity -> [Associativity] # enumFromTo :: Associativity -> Associativity -> [Associativity] # enumFromThenTo :: Associativity -> Associativity -> Associativity -> [Associativity] # | |
Enum DecidedStrictness | |
Defined in GHC.Generics Methods succ :: DecidedStrictness -> DecidedStrictness # pred :: DecidedStrictness -> DecidedStrictness # toEnum :: Int -> DecidedStrictness # fromEnum :: DecidedStrictness -> Int # enumFrom :: DecidedStrictness -> [DecidedStrictness] # enumFromThen :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # enumFromTo :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # enumFromThenTo :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # | |
Enum SourceStrictness | |
Defined in GHC.Generics Methods succ :: SourceStrictness -> SourceStrictness # pred :: SourceStrictness -> SourceStrictness # toEnum :: Int -> SourceStrictness # fromEnum :: SourceStrictness -> Int # enumFrom :: SourceStrictness -> [SourceStrictness] # enumFromThen :: SourceStrictness -> SourceStrictness -> [SourceStrictness] # enumFromTo :: SourceStrictness -> SourceStrictness -> [SourceStrictness] # enumFromThenTo :: SourceStrictness -> SourceStrictness -> SourceStrictness -> [SourceStrictness] # | |
Enum SourceUnpackedness | |
Defined in GHC.Generics Methods succ :: SourceUnpackedness -> SourceUnpackedness # pred :: SourceUnpackedness -> SourceUnpackedness # toEnum :: Int -> SourceUnpackedness # fromEnum :: SourceUnpackedness -> Int # enumFrom :: SourceUnpackedness -> [SourceUnpackedness] # enumFromThen :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # enumFromTo :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # enumFromThenTo :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # | |
Enum SeekMode | |
Enum IOMode | |
Defined in GHC.IO.IOMode | |
Enum Int16 | |
Enum Int32 | |
Enum Int64 | |
Enum Int8 | |
Enum DoCostCentres | |
Defined in GHC.RTS.Flags Methods succ :: DoCostCentres -> DoCostCentres # pred :: DoCostCentres -> DoCostCentres # toEnum :: Int -> DoCostCentres # fromEnum :: DoCostCentres -> Int # enumFrom :: DoCostCentres -> [DoCostCentres] # enumFromThen :: DoCostCentres -> DoCostCentres -> [DoCostCentres] # enumFromTo :: DoCostCentres -> DoCostCentres -> [DoCostCentres] # enumFromThenTo :: DoCostCentres -> DoCostCentres -> DoCostCentres -> [DoCostCentres] # | |
Enum DoHeapProfile | |
Defined in GHC.RTS.Flags Methods succ :: DoHeapProfile -> DoHeapProfile # pred :: DoHeapProfile -> DoHeapProfile # toEnum :: Int -> DoHeapProfile # fromEnum :: DoHeapProfile -> Int # enumFrom :: DoHeapProfile -> [DoHeapProfile] # enumFromThen :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # enumFromTo :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # enumFromThenTo :: DoHeapProfile -> DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # | |
Enum DoTrace | |
Defined in GHC.RTS.Flags Methods enumFrom :: DoTrace -> [DoTrace] # enumFromThen :: DoTrace -> DoTrace -> [DoTrace] # enumFromTo :: DoTrace -> DoTrace -> [DoTrace] # enumFromThenTo :: DoTrace -> DoTrace -> DoTrace -> [DoTrace] # | |
Enum GiveGCStats | |
Defined in GHC.RTS.Flags Methods succ :: GiveGCStats -> GiveGCStats # pred :: GiveGCStats -> GiveGCStats # toEnum :: Int -> GiveGCStats # fromEnum :: GiveGCStats -> Int # enumFrom :: GiveGCStats -> [GiveGCStats] # enumFromThen :: GiveGCStats -> GiveGCStats -> [GiveGCStats] # enumFromTo :: GiveGCStats -> GiveGCStats -> [GiveGCStats] # enumFromThenTo :: GiveGCStats -> GiveGCStats -> GiveGCStats -> [GiveGCStats] # | |
Enum IoSubSystem | |
Defined in GHC.RTS.Flags Methods succ :: IoSubSystem -> IoSubSystem # pred :: IoSubSystem -> IoSubSystem # toEnum :: Int -> IoSubSystem # fromEnum :: IoSubSystem -> Int # enumFrom :: IoSubSystem -> [IoSubSystem] # enumFromThen :: IoSubSystem -> IoSubSystem -> [IoSubSystem] # enumFromTo :: IoSubSystem -> IoSubSystem -> [IoSubSystem] # enumFromThenTo :: IoSubSystem -> IoSubSystem -> IoSubSystem -> [IoSubSystem] # | |
Enum GeneralCategory | |
Defined in GHC.Unicode Methods succ :: GeneralCategory -> GeneralCategory # pred :: GeneralCategory -> GeneralCategory # toEnum :: Int -> GeneralCategory # fromEnum :: GeneralCategory -> Int # enumFrom :: GeneralCategory -> [GeneralCategory] # enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory] # | |
Enum Word16 | |
Defined in GHC.Word | |
Enum Word32 | |
Defined in GHC.Word | |
Enum Word64 | |
Defined in GHC.Word | |
Enum Word8 | |
Enum CBlkCnt | |
Defined in System.Posix.Types Methods enumFrom :: CBlkCnt -> [CBlkCnt] # enumFromThen :: CBlkCnt -> CBlkCnt -> [CBlkCnt] # enumFromTo :: CBlkCnt -> CBlkCnt -> [CBlkCnt] # enumFromThenTo :: CBlkCnt -> CBlkCnt -> CBlkCnt -> [CBlkCnt] # | |
Enum CBlkSize | |
Defined in System.Posix.Types Methods succ :: CBlkSize -> CBlkSize # pred :: CBlkSize -> CBlkSize # enumFrom :: CBlkSize -> [CBlkSize] # enumFromThen :: CBlkSize -> CBlkSize -> [CBlkSize] # enumFromTo :: CBlkSize -> CBlkSize -> [CBlkSize] # enumFromThenTo :: CBlkSize -> CBlkSize -> CBlkSize -> [CBlkSize] # | |
Enum CCc | |
Defined in System.Posix.Types | |
Enum CClockId | |
Defined in System.Posix.Types Methods succ :: CClockId -> CClockId # pred :: CClockId -> CClockId # enumFrom :: CClockId -> [CClockId] # enumFromThen :: CClockId -> CClockId -> [CClockId] # enumFromTo :: CClockId -> CClockId -> [CClockId] # enumFromThenTo :: CClockId -> CClockId -> CClockId -> [CClockId] # | |
Enum CDev | |
Defined in System.Posix.Types | |
Enum CFsBlkCnt | |
Defined in System.Posix.Types Methods succ :: CFsBlkCnt -> CFsBlkCnt # pred :: CFsBlkCnt -> CFsBlkCnt # fromEnum :: CFsBlkCnt -> Int # enumFrom :: CFsBlkCnt -> [CFsBlkCnt] # enumFromThen :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # enumFromTo :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # enumFromThenTo :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # | |
Enum CFsFilCnt | |
Defined in System.Posix.Types Methods succ :: CFsFilCnt -> CFsFilCnt # pred :: CFsFilCnt -> CFsFilCnt # fromEnum :: CFsFilCnt -> Int # enumFrom :: CFsFilCnt -> [CFsFilCnt] # enumFromThen :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # enumFromTo :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # enumFromThenTo :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # | |
Enum CGid | |
Defined in System.Posix.Types | |
Enum CId | |
Defined in System.Posix.Types | |
Enum CIno | |
Defined in System.Posix.Types | |
Enum CKey | |
Defined in System.Posix.Types | |
Enum CMode | |
Defined in System.Posix.Types | |
Enum CNfds | |
Defined in System.Posix.Types | |
Enum CNlink | |
Defined in System.Posix.Types | |
Enum COff | |
Defined in System.Posix.Types | |
Enum CPid | |
Defined in System.Posix.Types | |
Enum CRLim | |
Defined in System.Posix.Types | |
Enum CSocklen | |
Defined in System.Posix.Types Methods succ :: CSocklen -> CSocklen # pred :: CSocklen -> CSocklen # enumFrom :: CSocklen -> [CSocklen] # enumFromThen :: CSocklen -> CSocklen -> [CSocklen] # enumFromTo :: CSocklen -> CSocklen -> [CSocklen] # enumFromThenTo :: CSocklen -> CSocklen -> CSocklen -> [CSocklen] # | |
Enum CSpeed | |
Defined in System.Posix.Types | |
Enum CSsize | |
Defined in System.Posix.Types | |
Enum CTcflag | |
Defined in System.Posix.Types Methods enumFrom :: CTcflag -> [CTcflag] # enumFromThen :: CTcflag -> CTcflag -> [CTcflag] # enumFromTo :: CTcflag -> CTcflag -> [CTcflag] # enumFromThenTo :: CTcflag -> CTcflag -> CTcflag -> [CTcflag] # | |
Enum CUid | |
Defined in System.Posix.Types | |
Enum Fd | |
Defined in System.Posix.Types | |
Enum Encoding | |
Defined in Basement.String Methods succ :: Encoding -> Encoding # pred :: Encoding -> Encoding # enumFrom :: Encoding -> [Encoding] # enumFromThen :: Encoding -> Encoding -> [Encoding] # enumFromTo :: Encoding -> Encoding -> [Encoding] # enumFromThenTo :: Encoding -> Encoding -> Encoding -> [Encoding] # | |
Enum UTF32_Invalid | |
Defined in Basement.String.Encoding.UTF32 Methods succ :: UTF32_Invalid -> UTF32_Invalid # pred :: UTF32_Invalid -> UTF32_Invalid # toEnum :: Int -> UTF32_Invalid # fromEnum :: UTF32_Invalid -> Int # enumFrom :: UTF32_Invalid -> [UTF32_Invalid] # enumFromThen :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] # enumFromTo :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] # enumFromThenTo :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] # | |
Enum Clock | |
Defined in System.Clock | |
Enum TimeSpec | |
Defined in System.Clock Methods succ :: TimeSpec -> TimeSpec # pred :: TimeSpec -> TimeSpec # enumFrom :: TimeSpec -> [TimeSpec] # enumFromThen :: TimeSpec -> TimeSpec -> [TimeSpec] # enumFromTo :: TimeSpec -> TimeSpec -> [TimeSpec] # enumFromThenTo :: TimeSpec -> TimeSpec -> TimeSpec -> [TimeSpec] # | |
Enum CryptoError | |
Defined in Crypto.Error.Types Methods succ :: CryptoError -> CryptoError # pred :: CryptoError -> CryptoError # toEnum :: Int -> CryptoError # fromEnum :: CryptoError -> Int # enumFrom :: CryptoError -> [CryptoError] # enumFromThen :: CryptoError -> CryptoError -> [CryptoError] # enumFromTo :: CryptoError -> CryptoError -> [CryptoError] # enumFromThenTo :: CryptoError -> CryptoError -> CryptoError -> [CryptoError] # | |
Enum FileType | |
Defined in System.Directory.Internal.Common Methods succ :: FileType -> FileType # pred :: FileType -> FileType # enumFrom :: FileType -> [FileType] # enumFromThen :: FileType -> FileType -> [FileType] # enumFromTo :: FileType -> FileType -> [FileType] # enumFromThenTo :: FileType -> FileType -> FileType -> [FileType] # | |
Enum XdgDirectory | |
Defined in System.Directory.Internal.Common Methods succ :: XdgDirectory -> XdgDirectory # pred :: XdgDirectory -> XdgDirectory # toEnum :: Int -> XdgDirectory # fromEnum :: XdgDirectory -> Int # enumFrom :: XdgDirectory -> [XdgDirectory] # enumFromThen :: XdgDirectory -> XdgDirectory -> [XdgDirectory] # enumFromTo :: XdgDirectory -> XdgDirectory -> [XdgDirectory] # enumFromThenTo :: XdgDirectory -> XdgDirectory -> XdgDirectory -> [XdgDirectory] # | |
Enum XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods succ :: XdgDirectoryList -> XdgDirectoryList # pred :: XdgDirectoryList -> XdgDirectoryList # toEnum :: Int -> XdgDirectoryList # fromEnum :: XdgDirectoryList -> Int # enumFrom :: XdgDirectoryList -> [XdgDirectoryList] # enumFromThen :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] # enumFromTo :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] # enumFromThenTo :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] # | |
Enum Extension | |
Defined in GHC.LanguageExtensions.Type Methods succ :: Extension -> Extension # pred :: Extension -> Extension # fromEnum :: Extension -> Int # enumFrom :: Extension -> [Extension] # enumFromThen :: Extension -> Extension -> [Extension] # enumFromTo :: Extension -> Extension -> [Extension] # enumFromThenTo :: Extension -> Extension -> Extension -> [Extension] # | |
Enum ClosureType | |
Defined in GHC.Exts.Heap.ClosureTypes Methods succ :: ClosureType -> ClosureType # pred :: ClosureType -> ClosureType # toEnum :: Int -> ClosureType # fromEnum :: ClosureType -> Int # enumFrom :: ClosureType -> [ClosureType] # enumFromThen :: ClosureType -> ClosureType -> [ClosureType] # enumFromTo :: ClosureType -> ClosureType -> [ClosureType] # enumFromThenTo :: ClosureType -> ClosureType -> ClosureType -> [ClosureType] # | |
Enum Ordering | |
Enum THResultType | |
Defined in GHCi.Message Methods succ :: THResultType -> THResultType # pred :: THResultType -> THResultType # toEnum :: Int -> THResultType # fromEnum :: THResultType -> Int # enumFrom :: THResultType -> [THResultType] # enumFromThen :: THResultType -> THResultType -> [THResultType] # enumFromTo :: THResultType -> THResultType -> [THResultType] # enumFromThenTo :: THResultType -> THResultType -> THResultType -> [THResultType] # | |
Enum StdMethod | |
Defined in Network.HTTP.Types.Method Methods succ :: StdMethod -> StdMethod # pred :: StdMethod -> StdMethod # fromEnum :: StdMethod -> Int # enumFrom :: StdMethod -> [StdMethod] # enumFromThen :: StdMethod -> StdMethod -> [StdMethod] # enumFromTo :: StdMethod -> StdMethod -> [StdMethod] # enumFromThenTo :: StdMethod -> StdMethod -> StdMethod -> [StdMethod] # | |
Enum Status | |
Defined in Network.HTTP.Types.Status | |
Enum IPv4 | |
Enum IPv6 | |
Enum IP | |
Defined in Data.IP.Addr | |
Enum IPv4 | |
Defined in Data.IP.Addr | |
Enum IPv6 | |
Defined in Data.IP.Addr | |
Enum PortConfig Source # | |
Defined in IHP.IDE.PortConfig Methods succ :: PortConfig -> PortConfig # pred :: PortConfig -> PortConfig # toEnum :: Int -> PortConfig # fromEnum :: PortConfig -> Int # enumFrom :: PortConfig -> [PortConfig] # enumFromThen :: PortConfig -> PortConfig -> [PortConfig] # enumFromTo :: PortConfig -> PortConfig -> [PortConfig] # enumFromThenTo :: PortConfig -> PortConfig -> PortConfig -> [PortConfig] # | |
Enum JobStatus Source # | |
Defined in IHP.Job.Types Methods succ :: JobStatus -> JobStatus # pred :: JobStatus -> JobStatus # fromEnum :: JobStatus -> Int # enumFrom :: JobStatus -> [JobStatus] # enumFromThen :: JobStatus -> JobStatus -> [JobStatus] # enumFromTo :: JobStatus -> JobStatus -> [JobStatus] # enumFromThenTo :: JobStatus -> JobStatus -> JobStatus -> [JobStatus] # | |
Enum LogLevel Source # | |
Enum PortNumber | |
Defined in Network.Socket.Types Methods succ :: PortNumber -> PortNumber # pred :: PortNumber -> PortNumber # fromEnum :: PortNumber -> Int # enumFrom :: PortNumber -> [PortNumber] # enumFromThen :: PortNumber -> PortNumber -> [PortNumber] # enumFromTo :: PortNumber -> PortNumber -> [PortNumber] # enumFromThenTo :: PortNumber -> PortNumber -> PortNumber -> [PortNumber] # | |
Enum Column | |
Defined in Database.PostgreSQL.LibPQ | |
Enum ExecStatus | |
Defined in Database.PostgreSQL.LibPQ Methods succ :: ExecStatus -> ExecStatus # pred :: ExecStatus -> ExecStatus # fromEnum :: ExecStatus -> Int # enumFrom :: ExecStatus -> [ExecStatus] # enumFromThen :: ExecStatus -> ExecStatus -> [ExecStatus] # enumFromTo :: ExecStatus -> ExecStatus -> [ExecStatus] # enumFromThenTo :: ExecStatus -> ExecStatus -> ExecStatus -> [ExecStatus] # | |
Enum FieldCode | |
Defined in Database.PostgreSQL.LibPQ Methods succ :: FieldCode -> FieldCode # pred :: FieldCode -> FieldCode # fromEnum :: FieldCode -> Int # enumFrom :: FieldCode -> [FieldCode] # enumFromThen :: FieldCode -> FieldCode -> [FieldCode] # enumFromTo :: FieldCode -> FieldCode -> [FieldCode] # enumFromThenTo :: FieldCode -> FieldCode -> FieldCode -> [FieldCode] # | |
Enum Format | |
Defined in Database.PostgreSQL.LibPQ | |
Enum Row | |
Defined in Database.PostgreSQL.LibPQ | |
Enum Verbosity | |
Defined in Database.PostgreSQL.LibPQ Methods succ :: Verbosity -> Verbosity # pred :: Verbosity -> Verbosity # fromEnum :: Verbosity -> Int # enumFrom :: Verbosity -> [Verbosity] # enumFromThen :: Verbosity -> Verbosity -> [Verbosity] # enumFromTo :: Verbosity -> Verbosity -> [Verbosity] # enumFromThenTo :: Verbosity -> Verbosity -> Verbosity -> [Verbosity] # | |
Enum IsolationLevel | |
Defined in Database.PostgreSQL.Simple.Transaction Methods succ :: IsolationLevel -> IsolationLevel # pred :: IsolationLevel -> IsolationLevel # toEnum :: Int -> IsolationLevel # fromEnum :: IsolationLevel -> Int # enumFrom :: IsolationLevel -> [IsolationLevel] # enumFromThen :: IsolationLevel -> IsolationLevel -> [IsolationLevel] # enumFromTo :: IsolationLevel -> IsolationLevel -> [IsolationLevel] # enumFromThenTo :: IsolationLevel -> IsolationLevel -> IsolationLevel -> [IsolationLevel] # | |
Enum ReadWriteMode | |
Defined in Database.PostgreSQL.Simple.Transaction Methods succ :: ReadWriteMode -> ReadWriteMode # pred :: ReadWriteMode -> ReadWriteMode # toEnum :: Int -> ReadWriteMode # fromEnum :: ReadWriteMode -> Int # enumFrom :: ReadWriteMode -> [ReadWriteMode] # enumFromThen :: ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] # enumFromTo :: ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] # enumFromThenTo :: ReadWriteMode -> ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] # | |
Enum DoPa | |
Defined in Text.Regex.TDFA.Common | |
Enum WhichTest | |
Defined in Text.Regex.TDFA.Common Methods succ :: WhichTest -> WhichTest # pred :: WhichTest -> WhichTest # fromEnum :: WhichTest -> Int # enumFrom :: WhichTest -> [WhichTest] # enumFromThen :: WhichTest -> WhichTest -> [WhichTest] # enumFromTo :: WhichTest -> WhichTest -> [WhichTest] # enumFromThenTo :: WhichTest -> WhichTest -> WhichTest -> [WhichTest] # | |
Enum Undefined | |
Defined in Relude.Debug Methods succ :: Undefined -> Undefined # pred :: Undefined -> Undefined # fromEnum :: Undefined -> Int # enumFrom :: Undefined -> [Undefined] # enumFromThen :: Undefined -> Undefined -> [Undefined] # enumFromTo :: Undefined -> Undefined -> [Undefined] # enumFromThenTo :: Undefined -> Undefined -> Undefined -> [Undefined] # | |
Enum FPFormat | |
Defined in Data.Text.Lazy.Builder.RealFloat Methods succ :: FPFormat -> FPFormat # pred :: FPFormat -> FPFormat # enumFrom :: FPFormat -> [FPFormat] # enumFromThen :: FPFormat -> FPFormat -> [FPFormat] # enumFromTo :: FPFormat -> FPFormat -> [FPFormat] # enumFromThenTo :: FPFormat -> FPFormat -> FPFormat -> [FPFormat] # | |
Enum Day | |
Enum DayOfWeek | |
Defined in Data.Time.Calendar.Week Methods succ :: DayOfWeek -> DayOfWeek # pred :: DayOfWeek -> DayOfWeek # fromEnum :: DayOfWeek -> Int # enumFrom :: DayOfWeek -> [DayOfWeek] # enumFromThen :: DayOfWeek -> DayOfWeek -> [DayOfWeek] # enumFromTo :: DayOfWeek -> DayOfWeek -> [DayOfWeek] # enumFromThenTo :: DayOfWeek -> DayOfWeek -> DayOfWeek -> [DayOfWeek] # | |
Enum DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Enum NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods succ :: NominalDiffTime -> NominalDiffTime # pred :: NominalDiffTime -> NominalDiffTime # toEnum :: Int -> NominalDiffTime # fromEnum :: NominalDiffTime -> Int # enumFrom :: NominalDiffTime -> [NominalDiffTime] # enumFromThen :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # enumFromTo :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # enumFromThenTo :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # | |
Enum Int128 | |
Defined in Data.WideWord.Int128 | |
Enum Word128 | |
Defined in Data.WideWord.Word128 Methods enumFrom :: Word128 -> [Word128] # enumFromThen :: Word128 -> Word128 -> [Word128] # enumFromTo :: Word128 -> Word128 -> [Word128] # enumFromThenTo :: Word128 -> Word128 -> Word128 -> [Word128] # | |
Enum Word256 | |
Defined in Data.WideWord.Word256 Methods enumFrom :: Word256 -> [Word256] # enumFromThen :: Word256 -> Word256 -> [Word256] # enumFromTo :: Word256 -> Word256 -> [Word256] # enumFromThenTo :: Word256 -> Word256 -> Word256 -> [Word256] # | |
Enum CompressionStrategy | |
Defined in Codec.Compression.Zlib.Stream Methods succ :: CompressionStrategy -> CompressionStrategy # pred :: CompressionStrategy -> CompressionStrategy # toEnum :: Int -> CompressionStrategy # fromEnum :: CompressionStrategy -> Int # enumFrom :: CompressionStrategy -> [CompressionStrategy] # enumFromThen :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # enumFromTo :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # enumFromThenTo :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # | |
Enum Format | |
Defined in Codec.Compression.Zlib.Stream | |
Enum Method | |
Defined in Codec.Compression.Zlib.Stream | |
Enum Integer | |
Enum Natural | |
Defined in GHC.Enum Methods enumFrom :: Natural -> [Natural] # enumFromThen :: Natural -> Natural -> [Natural] # enumFromTo :: Natural -> Natural -> [Natural] # enumFromThenTo :: Natural -> Natural -> Natural -> [Natural] # | |
Enum () | |
Enum Bool | |
Enum Char | |
Enum Int | |
Enum Levity | |
Defined in GHC.Enum | |
Enum VecCount | |
Defined in GHC.Enum Methods succ :: VecCount -> VecCount # pred :: VecCount -> VecCount # enumFrom :: VecCount -> [VecCount] # enumFromThen :: VecCount -> VecCount -> [VecCount] # enumFromTo :: VecCount -> VecCount -> [VecCount] # enumFromThenTo :: VecCount -> VecCount -> VecCount -> [VecCount] # | |
Enum VecElem | |
Defined in GHC.Enum Methods enumFrom :: VecElem -> [VecElem] # enumFromThen :: VecElem -> VecElem -> [VecElem] # enumFromTo :: VecElem -> VecElem -> [VecElem] # enumFromThenTo :: VecElem -> VecElem -> VecElem -> [VecElem] # | |
Enum Word | |
Enum a => Enum (And a) | |
Enum a => Enum (Iff a) | |
Enum a => Enum (Ior a) | |
Enum a => Enum (Xor a) | |
Enum a => Enum (Identity a) | |
Defined in Data.Functor.Identity Methods succ :: Identity a -> Identity a # pred :: Identity a -> Identity a # fromEnum :: Identity a -> Int # enumFrom :: Identity a -> [Identity a] # enumFromThen :: Identity a -> Identity a -> [Identity a] # enumFromTo :: Identity a -> Identity a -> [Identity a] # enumFromThenTo :: Identity a -> Identity a -> Identity a -> [Identity a] # | |
Enum a => Enum (First a) | |
Defined in Data.Semigroup Methods enumFrom :: First a -> [First a] # enumFromThen :: First a -> First a -> [First a] # enumFromTo :: First a -> First a -> [First a] # enumFromThenTo :: First a -> First a -> First a -> [First a] # | |
Enum a => Enum (Last a) | |
Defined in Data.Semigroup | |
Enum a => Enum (Max a) | |
Defined in Data.Semigroup | |
Enum a => Enum (Min a) | |
Defined in Data.Semigroup | |
Enum a => Enum (WrappedMonoid a) | |
Defined in Data.Semigroup Methods succ :: WrappedMonoid a -> WrappedMonoid a # pred :: WrappedMonoid a -> WrappedMonoid a # toEnum :: Int -> WrappedMonoid a # fromEnum :: WrappedMonoid a -> Int # enumFrom :: WrappedMonoid a -> [WrappedMonoid a] # enumFromThen :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromTo :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromThenTo :: WrappedMonoid a -> WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # | |
Integral a => Enum (Ratio a) | |
Defined in GHC.Real Methods enumFrom :: Ratio a -> [Ratio a] # enumFromThen :: Ratio a -> Ratio a -> [Ratio a] # enumFromTo :: Ratio a -> Ratio a -> [Ratio a] # enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] # | |
SizeValid n => Enum (Bits n) | |
Defined in Basement.Bits | |
Enum (CountOf ty) | |
Defined in Basement.Types.OffsetSize Methods succ :: CountOf ty -> CountOf ty # pred :: CountOf ty -> CountOf ty # fromEnum :: CountOf ty -> Int # enumFrom :: CountOf ty -> [CountOf ty] # enumFromThen :: CountOf ty -> CountOf ty -> [CountOf ty] # enumFromTo :: CountOf ty -> CountOf ty -> [CountOf ty] # enumFromThenTo :: CountOf ty -> CountOf ty -> CountOf ty -> [CountOf ty] # | |
Enum (Offset ty) | |
Defined in Basement.Types.OffsetSize Methods succ :: Offset ty -> Offset ty # pred :: Offset ty -> Offset ty # fromEnum :: Offset ty -> Int # enumFrom :: Offset ty -> [Offset ty] # enumFromThen :: Offset ty -> Offset ty -> [Offset ty] # enumFromTo :: Offset ty -> Offset ty -> [Offset ty] # enumFromThenTo :: Offset ty -> Offset ty -> Offset ty -> [Offset ty] # | |
Enum a => Enum (a) | |
Enum (Fixed a) | |
Defined in Data.Fixed Methods enumFrom :: Fixed a -> [Fixed a] # enumFromThen :: Fixed a -> Fixed a -> [Fixed a] # enumFromTo :: Fixed a -> Fixed a -> [Fixed a] # enumFromThenTo :: Fixed a -> Fixed a -> Fixed a -> [Fixed a] # | |
Enum (Proxy s) | |
Enum a => Enum (Const a b) | |
Defined in Data.Functor.Const Methods succ :: Const a b -> Const a b # pred :: Const a b -> Const a b # fromEnum :: Const a b -> Int # enumFrom :: Const a b -> [Const a b] # enumFromThen :: Const a b -> Const a b -> [Const a b] # enumFromTo :: Const a b -> Const a b -> [Const a b] # enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] # | |
Enum (f a) => Enum (Ap f a) | |
Defined in Data.Monoid | |
Enum (f a) => Enum (Alt f a) | |
Defined in Data.Semigroup.Internal Methods enumFrom :: Alt f a -> [Alt f a] # enumFromThen :: Alt f a -> Alt f a -> [Alt f a] # enumFromTo :: Alt f a -> Alt f a -> [Alt f a] # enumFromThenTo :: Alt f a -> Alt f a -> Alt f a -> [Alt f a] # | |
a ~ b => Enum (a :~: b) | |
Defined in Data.Type.Equality Methods succ :: (a :~: b) -> a :~: b # pred :: (a :~: b) -> a :~: b # fromEnum :: (a :~: b) -> Int # enumFrom :: (a :~: b) -> [a :~: b] # enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] # | |
Enum a => Enum (Tagged s a) | |
Defined in Data.Tagged Methods succ :: Tagged s a -> Tagged s a # pred :: Tagged s a -> Tagged s a # fromEnum :: Tagged s a -> Int # enumFrom :: Tagged s a -> [Tagged s a] # enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] # enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] # enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] # | |
a ~~ b => Enum (a :~~: b) | |
Defined in Data.Type.Equality Methods succ :: (a :~~: b) -> a :~~: b # pred :: (a :~~: b) -> a :~~: b # fromEnum :: (a :~~: b) -> Int # enumFrom :: (a :~~: b) -> [a :~~: b] # enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] # enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] # enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] # |