Copyright | (c) digitally induced GmbH 2020 |
---|---|
Safe Haskell | None |
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)
- class IsString a where
- fromString :: String -> a
- class Functor f => Applicative (f :: Type -> Type) where
- class Foldable (t :: Type -> 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)
- class IsLabel (x :: Symbol) a where
- fromLabel :: a
- (<>) :: 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
- 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 Symbol
- data TyCon
- (>=>) :: 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 :: Integer -> Int -> Int -> Day
- toGregorian :: Day -> (Integer, Int, Int)
- getCurrentTime :: IO UTCTime
- formatTime :: FormatTime t => TimeLocale -> String -> t -> String
- defaultTimeLocale :: TimeLocale
- parseTime :: ParseTime t => TimeLocale -> String -> String -> Maybe t
- parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t
- 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
- type String = [Char]
- 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 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
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- 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
- 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 :: Integer -> Int -> Int -> Maybe Day
- gregorianMonthLength :: Integer -> Int -> Int
- showGregorian :: Day -> String
- isLeapYear :: Integer -> Bool
- dayOfWeek :: Day -> DayOfWeek
- 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
- readTime :: ParseTime t => TimeLocale -> String -> String -> t
- readsTime :: ParseTime t => 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
- 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 {}
- data DayOfWeek
- data DiffTime
- data NominalDiffTime
- newtype UniversalTime = ModJulianDate {}
- class FormatTime t
- data TimeLocale = TimeLocale {}
- class ParseTime 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
- 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 DataRep
- data Constr
- data DataType
- data ConstrRep
- transpose :: [[a]] -> [[a]]
- catMaybes :: [Maybe a] -> [a]
- break :: (a -> Bool) -> [a] -> ([a], [a])
- genericSplitAt :: Integral i => i -> [a] -> ([a], [a])
- dropWhile :: (a -> Bool) -> [a] -> [a]
- groupBy :: (a -> a -> Bool) -> [a] -> [[a]]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- takeWhile :: (a -> Bool) -> [a] -> [a]
- undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- (!!) :: [a] -> Int -> a
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- 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]
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- stripPrefix :: Eq a => [a] -> [a] -> Maybe [a]
- deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a]
- delete :: Eq a => a -> [a] -> [a]
- type ConIndex = Int
- mkConstr :: DataType -> String -> [String] -> Fixity -> Constr
- data Fixity
- 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
- 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
- setJust :: forall model name value. (KnownSymbol name, SetField name model (Maybe value)) => Proxy name -> value -> model -> model
- modify :: forall model name value updateFunction. (KnownSymbol name, HasField name model value, SetField name model 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
- data (a :: k1) :~~: (b :: k2) where
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- 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]
- catchIOError :: IO a -> (IOError -> IO a) -> IO a
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- and :: Foldable t => t Bool -> Bool
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- concat :: Foldable t => t [a] -> [a]
- concatMap :: Foldable t => (a -> [b]) -> t a -> [b]
- maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- or :: Foldable t => t Bool -> Bool
- 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
- findIndices :: (a -> Bool) -> [a] -> [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]]
- 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 => (a -> b -> (a, c)) -> a -> t b -> (a, t c)
- mapAccumR :: Traversable t => (a -> b -> (a, c)) -> a -> t b -> (a, t c)
- cycle :: [a] -> [a]
- foldl1' :: (a -> a -> a) -> [a] -> a
- iterate :: (a -> a) -> a -> [a]
- iterate' :: (a -> a) -> a -> [a]
- scanl :: (b -> a -> b) -> b -> [a] -> [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]
- uncons :: [a] -> Maybe (a, [a])
- unzip :: [(a, b)] -> ([a], [b])
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- throw :: forall (r :: RuntimeRep) (a :: TYPE r) e. Exception e => e -> a
- catch :: Exception e => IO a -> (e -> IO a) -> IO a
- throwIO :: Exception e => e -> IO 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
- class FromRow a
- 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 -> ()
- tyConFingerprint :: TyCon -> Fingerprint
- tyConModule :: TyCon -> String
- tyConName :: TyCon -> String
- tyConPackage :: TyCon -> String
- data Point = Point {}
- 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
- mkDataType :: String -> [Constr] -> DataType
- mkFloatType :: String -> DataType
- mkIntType :: String -> DataType
- mkIntegralConstr :: (Integral a, Show a) => DataType -> a -> Constr
- mkNoRepType :: String -> DataType
- 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 TypeRep = SomeTypeRep
- class KeyValue kv where
- data RecordNotFoundException = RecordNotFoundException {
- queryAndParams :: (ByteString, [Action])
- data FieldWithUpdate name value
- data FieldWithDefault valueType
- = Default
- | NonDefault valueType
- data MetaBag = MetaBag {
- annotations :: ![(Text, Text)]
- touchedFields :: ![Text]
- originalDatabaseRecord :: Maybe Dynamic
- 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 ParsePrimaryKey primaryKey where
- parsePrimaryKey :: Text -> Maybe primaryKey
- 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 ModelContext = ModelContext {
- connectionPool :: Pool Connection
- transactionConnection :: Maybe Connection
- logger :: Logger
- trackTableReadCallback :: Maybe (ByteString -> IO ())
- notConnectedModelContext :: Logger -> ModelContext
- createModelContext :: NominalDiffTime -> Int -> ByteString -> Logger -> IO ModelContext
- createRecord :: (?modelContext :: ModelContext, CanCreate model) => model -> IO model
- isNew :: forall model id. (HasField "id" model id, Default id, Eq id) => model -> Bool
- getModelName :: forall model. KnownSymbol (GetModelName model) => Text
- recordToInputValue :: (HasField "id" entity (Id entity), Show (PrimaryKey (GetTableName entity))) => entity -> Text
- textToId :: (ParsePrimaryKey (PrimaryKey model), ConvertibleStrings text Text) => text -> Id' model
- measureTimeIfLogging :: (?modelContext :: ModelContext, Show q) => IO a -> Query -> q -> IO a
- sqlQuery :: (?modelContext :: ModelContext, ToRow q, FromRow r, Show q) => Query -> q -> IO [r]
- sqlExec :: (?modelContext :: ModelContext, ToRow q, Show q) => Query -> q -> IO Int64
- withDatabaseConnection :: (?modelContext :: ModelContext) => (Connection -> IO a) -> IO a
- sqlQueryScalar :: (?modelContext :: ModelContext) => (ToRow q, Show q, FromField value) => Query -> q -> IO value
- withTransaction :: (?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
- tableName :: forall model. KnownSymbol (GetTableName model) => Text
- tableNameByteString :: forall model. KnownSymbol (GetTableName model) => ByteString
- logQuery :: (?modelContext :: ModelContext, Show query, Show parameters) => query -> parameters -> NominalDiffTime -> IO ()
- deleteRecord :: forall model id. (?modelContext :: ModelContext, Show id, KnownSymbol (GetTableName model), HasField "id" model id, ToField id) => model -> IO ()
- deleteRecordById :: forall model id. (?modelContext :: ModelContext, Show id, KnownSymbol (GetTableName model), HasField "id" model id, ToField id) => id -> IO ()
- deleteRecords :: forall record id. (?modelContext :: ModelContext, Show id, KnownSymbol (GetTableName record), HasField "id" record id, record ~ GetModelById id, ToField id) => [record] -> IO ()
- deleteAll :: forall record. (?modelContext :: ModelContext, KnownSymbol (GetTableName 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
- trackTableRead :: (?modelContext :: ModelContext) => ByteString -> IO ()
- withTableReadTracker :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext, ?touchedTables :: IORef (Set ByteString)) => IO ()) -> IO ()
- 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 ()
- (++) :: 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
- preEscapedToHtml :: ToMarkup a => a -> Html
- 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 ValidatorResult
- 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
- getValidationFailure :: (KnownSymbol field, HasField "meta" model MetaBag) => Proxy field -> model -> Maybe Text
- type ValidatorIO value = value -> IO ValidatorResult
- type Validator valueType = valueType -> ValidatorResult
- validateField :: forall field fieldValue validator 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
- classes :: [(Text, Bool)] -> Text
- toHtml :: ToHtml a => a -> Html
- hsx :: QuasiQuoter
- validateIsUnique :: forall field model savedModel validationState fieldValue validationStateValue fetchedModel 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) => Proxy field -> model -> IO model
- validateCanView :: forall field user model validationState fieldValue validationStateValue fetchedModel. (?model :: model, ?modelContext :: ModelContext, FromRow fetchedModel, KnownSymbol (GetTableName fetchedModel), KnownSymbol field, HasField field model fieldValue, Fetchable fieldValue fetchedModel, CanView user fetchedModel, ValidateCanView' fieldValue fetchedModel, HasField "meta" user MetaBag, SetField "meta" user MetaBag) => Proxy field -> user -> IO user
- timeAgo :: UTCTime -> Html
- dateTime :: UTCTime -> Html
- date :: UTCTime -> Html
- data CSSFramework = CSSFramework {
- styledFlashMessage :: CSSFramework -> FlashMessage -> Html
- styledFlashMessages :: CSSFramework -> [FlashMessage] -> Html
- styledFormField :: CSSFramework -> FormField -> Html
- styledSubmitButton :: CSSFramework -> SubmitButton -> Html
- styledSubmitButtonClass :: Text
- styledFormFieldHelp :: CSSFramework -> FormField -> Html
- styledInputClass :: FormField -> Text
- styledInputInvalidClass :: FormField -> Text
- styledFormGroupClass :: Text
- styledValidationResult :: CSSFramework -> FormField -> Html
- styledValidationResultClass :: Text
- data InputType
- data FormContext model = FormContext {
- model :: model
- formAction :: !Text
- cssFramework :: CSSFramework
- data SubmitButton = SubmitButton {
- label :: Html
- buttonClass :: Text
- cssFramework :: CSSFramework
- data FormField = FormField {
- fieldType :: !InputType
- fieldName :: !AttributeValue
- fieldLabel :: !Text
- fieldValue :: !Text
- fieldInputId :: !Text
- validatorResult :: !(Maybe Text)
- fieldInput :: !(FormField -> Html)
- fieldClass :: !Text
- labelClass :: !Text
- 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
- data RootApplication = RootApplication
- class ConfigProvider a where
- getFrameworkConfig :: a -> 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
- 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
- findOption :: forall option. Typeable option => StateT TMap IO option
- buildFrameworkConfig :: ConfigBuilder -> IO FrameworkConfig
- fromConfig :: (?context :: context, ConfigProvider context) => (FrameworkConfig -> a) -> a
- getConfig :: (?context :: context, ConfigProvider context) => FrameworkConfig
- defaultIHPSessionCookie :: Text -> SetCookie
- defaultPort :: Int
- defaultAppPort :: IO Int
- defaultDatabaseUrl :: IO ByteString
- defaultLoggerForEnv :: Environment -> IO Logger
- isEnvironment :: (?context :: context, ConfigProvider context) => Environment -> Bool
- isDevelopment :: (?context :: context, ConfigProvider context) => Bool
- isProduction :: (?context :: context, ConfigProvider context) => Bool
- data JobStatus
- newtype JobWorker = JobWorker (JobWorkerArgs -> IO (Async ()))
- data JobWorkerArgs = JobWorkerArgs {
- allJobs :: IORef [Async ()]
- workerId :: UUID
- modelContext :: ModelContext
- frameworkConfig :: FrameworkConfig
- class Worker application where
- class Job job where
- perform :: (?modelContext :: ModelContext, ?context :: FrameworkConfig) => job -> IO ()
- maxAttempts :: (?job :: job) => 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 ()
- renderModal :: Modal -> Html
- modal :: (?context :: ControllerContext) => Html
- assetPath :: (?context :: ControllerContext) => Text -> 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. (?context :: ControllerContext, Typeable controller) => 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
- pageTitle :: (?context :: ControllerContext) => Text
- pageTitleOrDefault :: (?context :: ControllerContext) => Text -> Text
- pageTitleOrNothing :: (?context :: ControllerContext) => Maybe Text
- renderFlashMessages :: (?context :: ControllerContext) => Html
- newtype ViewLayout = ViewLayout ((?context :: ControllerContext) => Layout)
- setLayout :: (?context :: ControllerContext) => ((?context :: ControllerContext) => Layout) -> IO ()
- getLayout :: (?context :: ControllerContext) => IO Layout
- autoRefreshMeta :: (?context :: ControllerContext) => Html
- class ModelFormAction application 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 parent id application. (?context :: ControllerContext, Eq record, Typeable record, ModelFormAction application record, HasField "id" record id, HasField "meta" record MetaBag, Default id, Eq id) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- formFor' :: forall record parent id application. (?context :: ControllerContext, Eq record, Typeable record, HasField "id" record id, HasField "meta" record MetaBag, Default id, Eq id) => record -> Text -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html
- createFormContext :: forall record viewContext parent id application. (?context :: ControllerContext, Eq record, Typeable record, HasField "id" record id, HasField "meta" record MetaBag) => record -> FormContext record
- buildForm :: forall model parent id. (?context :: ControllerContext, HasField "id" model id, Default id, Eq id) => FormContext model -> ((?context :: ControllerContext, ?formContext :: FormContext model) => Html) -> Html
- submitButton :: forall model id. (?formContext :: FormContext model, HasField "id" model id, KnownSymbol (GetModelName model), Eq id, Default id) => 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. (?formContext :: FormContext model, HasField fieldName model Text, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => 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
- 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
- fieldNameToFieldLabel :: Text -> Text
- columnNameToFieldLabel :: Text -> Text
- removeIdSuffix :: Text -> Text
- currentUser :: (?context :: ControllerContext, user ~ CurrentUserRecord, Typeable user) => user
- 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
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 Bool | |
Enum Char | |
Enum Int | |
Enum Int8 | |
Enum Int16 | |
Enum Int32 | |
Enum Int64 | |
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 Ordering | |
Enum Word | |
Enum Word8 | |
Enum Word16 | |
Defined in GHC.Word | |
Enum Word32 | |
Defined in GHC.Word | |
Enum Word64 | |
Defined in GHC.Word | |
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 () | |
Enum SeekMode | |
Enum IOMode | |
Defined in GHC.IO.IOMode | |
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 CChar | |
Defined in Foreign.C.Types | |
Enum CInt | |
Defined in Foreign.C.Types | |
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 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 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 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 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 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 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 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 CBool | |
Defined in Foreign.C.Types | |
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 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 CSChar | |
Defined in Foreign.C.Types | |
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 CUChar | |
Defined in Foreign.C.Types | |
Enum CUid | |
Defined in System.Posix.Types | |
Enum CWchar | |
Defined in Foreign.C.Types | |
Enum Fd | |
Defined in System.Posix.Types | |
Enum LogLevel Source # | |
Enum Status | |
Defined in Network.HTTP.Types.Status | |
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 Format | |
Defined in Database.PostgreSQL.LibPQ | |
Enum Column | |
Defined in Database.PostgreSQL.LibPQ | |
Enum IPv6 | |
Enum IPv4 | |
Enum Row | |
Defined in Database.PostgreSQL.LibPQ | |
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 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 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 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 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 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 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 IP | |
Defined in Data.IP.Addr | |
Enum IPv4 | |
Defined in Data.IP.Addr | |
Enum IPv6 | |
Defined in Data.IP.Addr | |
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 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 Clock | |
Defined in System.Clock | |
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 CNfds | |
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 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 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] # | |
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] # | |
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 (Down a) | |
Defined in Data.Ord | |
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] # | |
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 (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 (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 (Proxy s) | |
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] # | |
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 (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 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] # | |
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] # | |
Enum (f a) => Enum (Ap f a) | |
Defined in Data.Monoid | |
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] # |
Instances
Eq Bool | |
Eq Char | |
Eq Double | |
Eq Float | |
Eq Int | |
Eq Int8 | |
Eq Int16 | |
Eq Int32 | |
Eq Int64 | |
Eq Integer | |
Eq Natural | |
Eq Ordering | |
Eq Word | |
Eq Word8 | |
Eq Word16 | |
Eq Word32 | |
Eq Word64 | |
Eq SomeTypeRep | |
Eq Exp | |
Eq Match | |
Eq Clause | |
Eq Pat | |
Eq Type | |
Eq Dec | |
Eq Name | |
Eq FunDep | |
Eq InjectivityAnn | |
Eq Overlap | |
Eq () | |
Eq TyCon | |
Eq Module | |
Eq TrName | |
Eq SeekMode | |
Eq IOErrorType | |
Defined in GHC.IO.Exception | |
Eq IOException | |
Defined in GHC.IO.Exception | |
Eq BufferMode | |
Defined in GHC.IO.Handle.Types | |
Eq Handle | |
Eq IOMode | |
Eq ByteString | |
Defined in Data.ByteString.Internal | |
Eq IntSet | |
Eq Day | |
Eq UTCTime | |
Eq ConcException | |
Defined in UnliftIO.Internals.Async Methods (==) :: ConcException -> ConcException -> Bool # (/=) :: ConcException -> ConcException -> Bool # | |
Eq ByteString | |
Eq UUID | |
Eq CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (==) :: CalendarDiffDays -> CalendarDiffDays -> Bool # (/=) :: CalendarDiffDays -> CalendarDiffDays -> Bool # | |
Eq DayOfWeek | |
Eq DiffTime | |
Eq NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (==) :: NominalDiffTime -> NominalDiffTime -> Bool # (/=) :: NominalDiffTime -> NominalDiffTime -> Bool # | |
Eq UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods (==) :: UniversalTime -> UniversalTime -> Bool # (/=) :: UniversalTime -> UniversalTime -> Bool # | |
Eq TimeLocale | |
Defined in Data.Time.Format.Locale | |
Eq CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (==) :: CalendarDiffTime -> CalendarDiffTime -> Bool # (/=) :: CalendarDiffTime -> CalendarDiffTime -> Bool # | |
Eq LocalTime | |
Eq TimeOfDay | |
Eq TimeZone | |
Eq SomeSymbol | |
Eq SomeNat | |
Eq Number | |
Eq More | |
Eq Scientific | |
Eq Pos | |
Eq CChar | |
Eq DataRep | |
Eq Constr | |
Eq Lit | |
Eq NameFlavour | |
Eq ConstrRep | |
Eq SrcLoc | |
Eq All | |
Eq Any | |
Eq TimeLocale | |
Eq CInt | |
Eq Builder Source # | Need for the 'Eq QueryBuilder' instance You likely wonder: Why do we need the 'Eq SQLQuery' instance if this causes so much trouble? This has to do with how has-many and belongs-to relations are models by the SchemaCompiler E.g. given a table users and a table posts. Each Post belongs to a user. The schema compiler will
add a field 'posts :: QueryBuilder "posts"' with the default value This is needed to support syntax like this: user |> get #posts |> fetch |
Eq Void | |
Eq Associativity | |
Eq DecidedStrictness | |
Eq Fixity | |
Eq SourceStrictness | |
Eq SourceUnpackedness | |
Eq SpecConstrAnnotation | |
Eq Version | |
Eq Mode | |
Eq Style | |
Eq TextDetails | |
Eq Doc | |
Eq ByteArray | |
Eq ThreadId | |
Eq UnpackedUUID | |
Eq Fixity | |
Eq CClock | |
Eq CDouble | |
Eq CFloat | |
Eq CIntMax | |
Eq CIntPtr | |
Eq CLLong | |
Eq CLong | |
Eq CPtrdiff | |
Eq CSUSeconds | |
Eq CShort | |
Eq CSigAtomic | |
Eq CSize | |
Eq CTime | |
Eq CUInt | |
Eq CUIntMax | |
Eq CUIntPtr | |
Eq CULLong | |
Eq CULong | |
Eq CUSeconds | |
Eq CUShort | |
Eq BigNat | |
Eq SystemTime | |
Eq InvalidPosException | |
Eq Pos | |
Eq SourcePos | |
Eq GeneralCategory | |
Eq ForeignSrcLang | |
Eq Extension | |
Eq AnnLookup | |
Eq AnnTarget | |
Eq Bang | |
Eq Body | |
Eq Bytes | |
Eq Callconv | |
Eq Con | |
Eq DecidedStrictness | |
Eq DerivClause | |
Eq DerivStrategy | |
Eq FamilyResultSig | |
Eq Fixity | |
Eq FixityDirection | |
Eq Foreign | |
Eq Guard | |
Eq Info | |
Eq Inline | |
Eq Loc | |
Eq ModName | |
Eq Module | |
Eq ModuleInfo | |
Eq NameSpace | |
Eq OccName | |
Eq PatSynArgs | |
Eq PatSynDir | |
Eq Phases | |
Eq PkgName | |
Eq Pragma | |
Eq Range | |
Eq Role | |
Eq RuleBndr | |
Eq RuleMatch | |
Eq Safety | |
Eq SourceStrictness | |
Eq SourceUnpackedness | |
Eq Stmt | |
Eq TyLit | |
Eq TySynEqn | |
Eq TyVarBndr | |
Eq TypeFamilyHead | |
Eq SrcSpanInfo | |
Eq SrcLoc | |
Eq SrcSpan | |
Eq ConstructorInfo | |
Eq DatatypeInfo | |
Eq ShortByteString | |
Eq Fingerprint | |
Eq Unique | |
Eq Boxed | |
Eq Tool | |
Eq ConstructorVariant | |
Eq DatatypeVariant | |
Eq FieldStrictness | |
Eq Strictness | |
Eq Unpackedness | |
Eq Specificity | |
Eq MaskingState | |
Eq Node Source # | |
Eq Attribute Source # | |
Eq AttributeValue Source # | |
Defined in IHP.HtmlSupport.Parser Methods (==) :: AttributeValue -> AttributeValue -> Bool # (/=) :: AttributeValue -> AttributeValue -> Bool # | |
Eq CBlkCnt | |
Eq CBlkSize | |
Eq CBool | |
Eq CCc | |
Eq CClockId | |
Eq CDev | |
Eq CFsBlkCnt | |
Eq CFsFilCnt | |
Eq CGid | |
Eq CId | |
Eq CIno | |
Eq CKey | |
Eq CMode | |
Eq CNlink | |
Eq COff | |
Eq CPid | |
Eq CRLim | |
Eq CSChar | |
Eq CSpeed | |
Eq CSsize | |
Eq CTcflag | |
Eq CTimer | |
Eq CUChar | |
Eq CUid | |
Eq CWchar | |
Eq Fd | |
Eq LogStr | |
Eq UnixDiffTime | |
Eq UnixTime | |
Eq LogLevel Source # | |
Eq Permissions | |
Eq Status | |
Eq Unique | |
Eq SockAddr | |
Eq AddrInfo | |
Eq AddrInfoFlag | |
Eq NameInfoFlag | |
Eq Family | |
Eq SocketType | |
Eq HttpVersion | |
Eq InflectionException | |
Eq SomeWord | |
Eq ExecStatus | |
Eq ResultError | |
Eq ConnectInfo | |
Eq Connection | |
Eq FormatError | |
Eq QueryError | |
Eq SqlError | |
Eq Query | |
Eq TransactionMode | |
Eq Action Source # | Needed for the 'Eq QueryBuilder' instance |
Eq Identifier | |
Eq Null | |
Eq Oid | |
Eq QualifiedIdentifier | |
Eq Value | |
Eq Format | |
Eq JSONPathElement | |
Eq Column | |
Eq Savepoint | |
Eq IP | |
Eq IPv6 | |
Eq IPv4 | |
Eq ShortText | |
Eq AbsoluteTime | |
Eq IPv6Range | |
Eq Bytes | |
Eq IPv4Range | |
Eq B | |
Eq Result | |
Eq ConnStatus | |
Eq Row | |
Eq DotNetTime | |
Defined in Data.Aeson.Types.Internal | |
Eq SumEncoding | |
Defined in Data.Aeson.Types.Internal | |
Eq Cancel | |
Eq CopyInResult | |
Eq FieldCode | |
Eq FlushStatus | |
Eq LoFd | |
Eq PollingStatus | |
Eq TransactionStatus | |
Eq Verbosity | |
Eq ArithException | |
Eq ErrorCall | |
Eq Point Source # | |
Eq BlockReason | |
Eq ThreadStatus | |
Eq MetaBag Source # | |
Eq IsolationLevel | |
Eq ReadWriteMode | |
Eq ExitCode | |
Eq ArrayException | |
Eq AsyncException | |
Eq PortNumber | |
Eq Socket | |
Eq Newline | |
Eq NewlineMode | |
Eq Notification | |
Eq AsyncCancelled | |
Eq XdgDirectory | |
Eq XdgDirectoryList | |
Eq CmdSpec | |
Eq CreateProcess | |
Eq StdStream | |
Eq IODeviceType | |
Eq PostgresType Source # | |
Defined in IHP.IDE.SchemaDesigner.Types | |
Eq Expression Source # | |
Defined in IHP.IDE.SchemaDesigner.Types | |
Eq Constraint Source # | |
Defined in IHP.IDE.SchemaDesigner.Types | |
Eq PrimaryKeyConstraint Source # | |
Defined in IHP.IDE.SchemaDesigner.Types Methods (==) :: PrimaryKeyConstraint -> PrimaryKeyConstraint -> Bool # (/=) :: PrimaryKeyConstraint -> PrimaryKeyConstraint -> Bool # | |
Eq OnDelete Source # | |
Eq Column Source # | |
Eq CreateTable Source # | |
Defined in IHP.IDE.SchemaDesigner.Types | |
Eq Statement Source # | |
Eq GeneratorAction Source # | |
Defined in IHP.IDE.CodeGen.Types Methods (==) :: GeneratorAction -> GeneratorAction -> Bool # (/=) :: GeneratorAction -> GeneratorAction -> Bool # | |
Eq Environment Source # | |
Defined in IHP.Environment | |
Eq Salt | |
Eq Encoding | |
Eq String | |
Eq ASCII7_Invalid | |
Eq ISO_8859_1_Invalid | |
Eq UTF16_Invalid | |
Eq UTF32_Invalid | |
Eq FileSize | |
Eq InvalidActionArgumentException Source # | |
Defined in IHP.Router.Types | |
Eq CondensePolicy | |
Eq DelimPolicy | |
Eq EndPolicy | |
Eq Migration Source # | |
Eq ValidatorResult Source # | |
Defined in IHP.ValidationSupport.Types Methods (==) :: ValidatorResult -> ValidatorResult -> Bool # (/=) :: ValidatorResult -> ValidatorResult -> Bool # | |
Eq DoPa | |
Eq Action | |
Eq OP | |
Eq QT | |
Eq TagTask | |
Eq TagUpdate | |
Eq WhichTest | |
Eq CodePoint | |
Eq DecoderState | |
Eq SameSiteOption | |
Eq SetCookie | |
Eq InvalidRequest | |
Eq CryptoError | |
Eq IP | |
Eq IPv4 | |
Eq IPv6 | |
Eq IPRange | |
Eq RootApplication Source # | |
Defined in IHP.FrameworkConfig Methods (==) :: RootApplication -> RootApplication -> Bool # (/=) :: RootApplication -> RootApplication -> Bool # | |
Eq JobStatus Source # | |
Eq Errno | |
Eq PortConfig Source # | |
Defined in IHP.IDE.PortConfig | |
Eq HandlePosn | |
Eq CompressionOptions | |
Eq PermessageDeflate | |
Eq SizeLimit | |
Eq ConnectionException | |
Eq ControlMessage | |
Eq DataMessage | |
Eq Message | |
Eq Clock | |
Eq TimeSpec | |
Eq CompressionLevel | |
Eq CompressionStrategy | |
Eq DictionaryHash | |
Eq Format | |
Eq MemoryLevel | |
Eq Method | |
Eq WindowBits | |
Eq OutputLine Source # | |
Defined in IHP.IDE.Types | |
Eq ConnectionType | |
Eq CNfds | |
Eq CSocklen | |
Eq ByteRange | |
Eq StdMethod | |
Eq EscapeItem | |
Eq Bound | |
Eq ParamException Source # | |
Defined in IHP.Controller.Param Methods (==) :: ParamException -> ParamException -> Bool # (/=) :: ParamException -> ParamException -> Bool # | |
Eq URI | |
Eq URIAuth | |
Eq ViewConfig Source # | |
Defined in IHP.IDE.CodeGen.ViewGenerator | |
Eq MailConfig Source # | |
Defined in IHP.IDE.CodeGen.MailGenerator | |
Eq JobConfig Source # | |
Eq Address | |
Eq Boundary | |
Eq Disposition | |
Eq Encoding | |
Eq Part | |
Eq PartContent | |
Eq QPC | |
Eq Event | |
Eq SMTPConnection | |
Eq AuthType | |
Eq Cookie | |
Eq CookieJar | |
Eq Proxy | |
Eq ResponseTimeout | |
Eq StreamFileStatus | |
Eq DigestAuthExceptionDetails | |
Eq ResponseClose | |
Eq SharedSecret | |
Eq ConnHost | |
Eq ConnKey | |
Eq StatusHeaders | |
Eq Content | |
Eq Doctype | |
Eq Document | |
Eq Element | |
Eq ExternalID | |
Eq Instruction | |
Eq Miscellaneous | |
Eq Name | |
Eq Node | |
Eq Prologue | |
Eq CodeGenController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: CodeGenController -> CodeGenController -> Bool # (/=) :: CodeGenController -> CodeGenController -> Bool # | |
Eq LogsController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: LogsController -> LogsController -> Bool # (/=) :: LogsController -> LogsController -> Bool # | |
Eq DataController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: DataController -> DataController -> Bool # (/=) :: DataController -> DataController -> Bool # | |
Eq EnumValuesController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: EnumValuesController -> EnumValuesController -> Bool # (/=) :: EnumValuesController -> EnumValuesController -> Bool # | |
Eq EnumsController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: EnumsController -> EnumsController -> Bool # (/=) :: EnumsController -> EnumsController -> Bool # | |
Eq ColumnsController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: ColumnsController -> ColumnsController -> Bool # (/=) :: ColumnsController -> ColumnsController -> Bool # | |
Eq TablesController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: TablesController -> TablesController -> Bool # (/=) :: TablesController -> TablesController -> Bool # | |
Eq SchemaController Source # | |
Defined in IHP.IDE.ToolServer.Types Methods (==) :: SchemaController -> SchemaController -> Bool # (/=) :: SchemaController -> SchemaController -> Bool # | |
Eq MediaType | |
Eq FileMeta | |
Eq Key | |
Eq IV | |
Eq WelcomeController Source # | |
Defined in IHP.Welcome.Controller Methods (==) :: WelcomeController -> WelcomeController -> Bool # (/=) :: WelcomeController -> WelcomeController -> Bool # | |
Eq AWSAuthVersion | |
Eq Auth | |
Eq Link | |
Eq RSAError | |
Eq TelemetryInfo Source # | |
Defined in IHP.Telemetry Methods (==) :: TelemetryInfo -> TelemetryInfo -> Bool # (/=) :: TelemetryInfo -> TelemetryInfo -> Bool # | |
Eq FileType | |
Eq a => Eq [a] | |
Eq a => Eq (Maybe a) | |
Eq a => Eq (Ratio a) | |
Eq (Ptr a) | |
Eq (FunPtr a) | |
Eq p => Eq (Par1 p) | |
Eq (Async a) | |
Eq (Chan a) | |
Eq a => Eq (Identity a) | |
Eq a => Eq (Down a) | |
Eq m => Eq (WrappedMonoid m) | |
Defined in Data.Semigroup Methods (==) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (/=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # | |
Eq (TVar a) | |
Eq (IORef a) | |
Eq (MVar a) | |
Eq a => Eq (IntMap a) | |
Eq a => Eq (Seq a) | |
Eq a => Eq (Set a) | |
Eq a => Eq (DList a) | |
Eq mono => Eq (NonNull mono) | |
Eq (TBQueue a) | |
Eq (TChan a) | |
Eq (TMVar a) | |
Defined in Control.Concurrent.STM.TMVar |