Safe Haskell | Safe-Inferred |
---|
IHP.Prelude
Synopsis
- data Text
- data Char
- data IO a
- class Show a
- type String = [Char]
- class Typeable (a :: k)
- data ByteString
- class (Typeable e, Show e) => Exception e where
- toException :: e -> SomeException
- fromException :: SomeException -> Maybe e
- displayException :: e -> String
- data Map k a
- class Applicative m => Monad (m :: Type -> Type) where
- class Functor (f :: Type -> Type) where
- data Maybe a
- data IOException
- data Set a
- class IsString a where
- fromString :: String -> a
- class Read a
- data Either a b
- data Float
- data Vector a
- data HashMap k v
- type LByteString = ByteString
- data Bool
- class Semigroup a => Monoid a where
- class Functor f => Applicative (f :: Type -> Type) where
- class Eq a where
- class Num a where
- data Integer
- data Int
- 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 Monad m => MonadIO (m :: Type -> Type) where
- newtype Down a = Down {
- getDown :: a
- class Storable a
- data SomeException
- type FilePath = String
- type IOError = IOException
- data IOErrorType
- type LText = Text
- type SVector = Vector
- type UVector = Vector
- data IntMap a
- data IntSet
- data Seq a
- class Eq a => Hashable a where
- hashWithSalt :: Int -> a -> Int
- hash :: a -> Int
- data HashSet a
- class (Vector Vector a, MVector MVector a) => Unbox a
- data Double
- data Word
- data Ordering
- class Foldable (t :: Type -> Type)
- class (Functor t, Foldable t) => Traversable (t :: Type -> Type)
- type Rational = Ratio Integer
- class (Real a, Fractional a) => RealFrac 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 (Num a, Ord a) => Real a where
- toRational :: a -> Rational
- class Eq a => Ord a where
- class Bounded a where
- 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 Fractional a => Floating a where
- data Word64
- data Word32
- data Word8
- data Int64
- data Int32
- (.) :: 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
- ($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b
- mapMaybe :: (a -> Maybe b) -> [a] -> [b]
- fromMaybe :: a -> Maybe a -> a
- isJust :: Maybe a -> Bool
- listToMaybe :: [a] -> Maybe a
- bool :: a -> a -> Bool -> a
- (||) :: Bool -> Bool -> Bool
- (<>) :: Semigroup a => a -> a -> a
- undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a
- (>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c
- 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
- isNothing :: Maybe a -> Bool
- maybe :: b -> (a -> b) -> Maybe a -> b
- maybeToList :: Maybe a -> [a]
- comparing :: Ord a => (b -> a) -> b -> b -> Ordering
- curry :: ((a, b) -> c) -> a -> b -> c
- fst :: (a, b) -> a
- snd :: (a, b) -> b
- 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
- ioError :: IOError -> IO a
- userError :: String -> IOError
- 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
- catMaybes :: [Maybe a] -> [a]
- 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')
- (<|>) :: Alternative f => f a -> f a -> f a
- lift :: (MonadTrans t, Monad m) => m a -> t m a
- otherwise :: Bool
- realToFrac :: (Real a, Fractional b) => a -> b
- fromIntegral :: (Integral a, Num b) => a -> b
- seq :: forall {r :: RuntimeRep} a (b :: TYPE r). a -> b -> b
- catchIOError :: IO a -> (IOError -> IO a) -> IO a
- putStr :: Text -> IO ()
- putStrLn :: Text -> IO ()
- module IHP.HaskellSupport
- data UUID
- class Default a where
- def :: a
- tshow :: Show a => a -> Text
- data Proxy (t :: k) = Proxy
- when :: Applicative f => Bool -> f () -> f ()
- unless :: Applicative f => Bool -> f () -> f ()
- mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b)
- sequence :: (Traversable t, Monad m) => t (m a) -> m (t a)
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b)
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- join :: Monad m => m (m a) -> m a
- forever :: Applicative f => f a -> f b
- group :: Eq a => [a] -> [[a]]
- delete :: Eq a => a -> [a] -> [a]
- take :: Int -> [a] -> [a]
- (!!) :: HasCallStack => [a] -> Int -> a
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- map :: (a -> b) -> [a] -> [b]
- foldr1 :: Foldable t => (a -> a -> a) -> t a -> a
- foldl1 :: Foldable t => (a -> a -> a) -> t a -> a
- foldl :: Foldable t => (b -> a -> b) -> b -> t a -> b
- minimum :: (Foldable t, Ord a) => t a -> a
- maximum :: (Foldable t, Ord a) => t a -> a
- sum :: (Foldable t, Num a) => t a -> a
- product :: (Foldable t, Num a) => t a -> a
- length :: Foldable t => t a -> Int
- foldr :: Foldable t => (a -> b -> b) -> b -> t a -> b
- elem :: (Foldable t, Eq a) => a -> t a -> Bool
- foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b
- takeWhile :: (a -> Bool) -> [a] -> [a]
- (\\) :: Eq a => [a] -> [a] -> [a]
- repeat :: a -> [a]
- intersect :: Eq a => [a] -> [a] -> [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]
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- or :: Foldable t => t Bool -> Bool
- maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a]
- singleton :: a -> [a]
- sort :: Ord a => [a] -> [a]
- sortOn :: Ord b => (a -> b) -> [a] -> [a]
- stripPrefix :: Eq a => [a] -> [a] -> Maybe [a]
- unzip :: [(a, b)] -> ([a], [b])
- zip :: [a] -> [b] -> [(a, b)]
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d])
- zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)]
- zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e]
- unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e])
- zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)]
- zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f]
- unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f])
- zip6 :: [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]
- unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g])
- zip7 :: [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]
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- union :: Eq a => [a] -> [a] -> [a]
- break :: (a -> Bool) -> [a] -> ([a], [a])
- drop :: Int -> [a] -> [a]
- dropWhile :: (a -> Bool) -> [a] -> [a]
- filter :: (a -> Bool) -> [a] -> [a]
- groupBy :: (a -> a -> Bool) -> [a] -> [[a]]
- partition :: (a -> Bool) -> [a] -> ([a], [a])
- permutations :: [a] -> [[a]]
- replicate :: Int -> a -> [a]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- subsequences :: [a] -> [[a]]
- uncons :: [a] -> Maybe (a, [a])
- reverse :: [a] -> [a]
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- insert :: Ord a => a -> [a] -> [a]
- findIndex :: (a -> Bool) -> [a] -> Maybe Int
- foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a
- scanl :: (b -> a -> b) -> b -> [a] -> [b]
- unfoldr :: (b -> Maybe (a, b)) -> b -> [a]
- tails :: [a] -> [[a]]
- dropWhileEnd :: (a -> Bool) -> [a] -> [a]
- inits :: [a] -> [[a]]
- 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)
- scanl1 :: (a -> a -> a) -> [a] -> [a]
- scanr :: (a -> b -> b) -> b -> [a] -> [b]
- scanr1 :: (a -> a -> a) -> [a] -> [a]
- transpose :: [[a]] -> [[a]]
- elemIndex :: Eq a => a -> [a] -> Maybe Int
- elemIndices :: Eq a => a -> [a] -> [Int]
- findIndices :: (a -> Bool) -> [a] -> [Int]
- genericSplitAt :: Integral i => i -> [a] -> ([a], [a])
- scanl' :: (b -> a -> b) -> b -> [a] -> [b]
- cycle :: HasCallStack => [a] -> [a]
- iterate :: (a -> a) -> a -> [a]
- genericTake :: Integral i => i -> [a] -> [a]
- intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- genericReplicate :: Integral i => i -> a -> [a]
- iterate' :: (a -> a) -> a -> [a]
- deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- genericDrop :: Integral i => i -> [a] -> [a]
- genericIndex :: Integral i => [a] -> i -> a
- genericLength :: Num i => [a] -> i
- insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a]
- nub :: Eq a => [a] -> [a]
- nubBy :: (a -> a -> Bool) -> [a] -> [a]
- isSubsequenceOf :: Eq a => [a] -> [a] -> Bool
- 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]
- show :: Show a => a -> Text
- class ConvertibleStrings a b where
- convertString :: a -> b
- cs :: ConvertibleStrings a b => a -> b
- unwords :: [Text] -> Text
- unlines :: [Text] -> Text
- words :: Text -> [Text]
- lines :: Text -> [Text]
- isPrefixOf :: Text -> Text -> Bool
- isSuffixOf :: Text -> Text -> Bool
- isInfixOf :: Text -> Text -> Bool
- intercalate :: Text -> [Text] -> Text
- intersperse :: Char -> Text -> Text
- splitAt :: Int -> Text -> (Text, Text)
- toLower :: Text -> Text
- toUpper :: Text -> Text
- plain :: QuasiQuoter
- (++) :: Semigroup a => a -> a -> a
- error :: Text -> a
- class Typeable a => Data a
- class KnownSymbol (n :: Symbol)
- data Symbol
- symbolVal :: forall (n :: Symbol) proxy. KnownSymbol n => proxy n -> String
- module IHP.NameSupport
- data ModelContext = ModelContext {
- connectionPool :: Pool Connection
- transactionConnection :: Maybe Connection
- logger :: Logger
- trackTableReadCallback :: Maybe (ByteString -> IO ())
- rowLevelSecurity :: Maybe RowLevelSecurityContext
- class CanUpdate a where
- updateRecord :: (?modelContext :: ModelContext) => a -> IO a
- type NormalizeModel model = GetModelByTableName (GetTableName model)
- type Id model = Id' (GetTableName model)
- type family GetTableName model :: Symbol
- type family GetModelName model :: Symbol
- data MetaBag = MetaBag {
- annotations :: ![(Text, Violation)]
- touchedFields :: ![Text]
- originalDatabaseRecord :: Maybe Dynamic
- createRecord :: (?modelContext :: ModelContext, CanCreate model) => model -> IO model
- 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 ()
- type TMap = TypeRepMap Identity
- class FromRow a
- null :: MonoFoldable mono => mono -> Bool
- catch :: Exception e => IO a -> (e -> IO a) -> IO a
- throw :: forall (r :: RuntimeRep) (a :: TYPE r) e. Exception e => e -> a
- throwIO :: Exception e => e -> IO a
- fail :: MonadFail m => String -> m a
- trimming :: QuasiQuoter
- type HasCallStack = ?callStack :: CallStack
- data CallStack
Documentation
Instances
Instances
FromJSON Char | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Char | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Char | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSONKey Char | |
Defined in Data.Aeson.Types.ToJSON | |
Data Char | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char # dataTypeOf :: Char -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) # gmapT :: (forall b. Data b => b -> b) -> Char -> Char # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # | |
Storable Char | |
Defined in Foreign.Storable | |
Bounded Char | |
Enum Char | |
Read Char | |
Show Char | |
Subtractive Char | |
PrimMemoryComparable Char | |
Defined in Basement.PrimType | |
PrimType Char | |
Defined in Basement.PrimType Associated Types type PrimSize Char :: Nat Methods primSizeInBytes :: Proxy Char -> CountOf Word8 primShiftToBytes :: Proxy Char -> Int primBaUIndex :: ByteArray# -> Offset Char -> Char primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> prim Char primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> Char -> prim () primAddrIndex :: Addr# -> Offset Char -> Char primAddrRead :: PrimMonad prim => Addr# -> Offset Char -> prim Char primAddrWrite :: PrimMonad prim => Addr# -> Offset Char -> Char -> prim () | |
ToMarkup String | |
Defined in Text.Blaze | |
ToMarkup Char | |
Defined in Text.Blaze | |
ToValue String | |
Defined in Text.Blaze | |
ToValue Char | |
Defined in Text.Blaze | |
FoldCase Char | |
Defined in Data.CaseInsensitive.Internal | |
Serialize Char | |
Defined in Data.Serialize | |
NFData Char | |
Defined in Control.DeepSeq | |
ToLogStr String | |
Defined in System.Log.FastLogger.LogStr | |
Eq Char | |
Ord Char | |
Hashable Char | |
Defined in Data.Hashable.Class | |
ToHtml String | |
Defined in IHP.HSX.ToHtml | |
EnvVarReader String Source # | |
Defined in IHP.FrameworkConfig Methods envStringToValue :: ByteString -> Either Text String Source # | |
TraversableStream String | |
Defined in Text.Megaparsec.Stream Methods reachOffset :: Int -> PosState String -> (Maybe String, PosState String) reachOffsetNoLine :: Int -> PosState String -> PosState String | |
VisualStream String | |
Defined in Text.Megaparsec.Stream Methods showTokens :: Proxy String -> NonEmpty (Token String) -> String tokensLength :: Proxy String -> NonEmpty (Token String) -> Int | |
FromField Char | |
Defined in Database.PostgreSQL.Simple.FromField | |
Prim Char | |
Defined in Data.Primitive.Types Methods alignment# :: Char -> Int# indexByteArray# :: ByteArray# -> Int# -> Char readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Char #) writeByteArray# :: MutableByteArray# s -> Int# -> Char -> State# s -> State# s setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Char -> State# s -> State# s indexOffAddr# :: Addr# -> Int# -> Char readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Char #) writeOffAddr# :: Addr# -> Int# -> Char -> State# s -> State# s setOffAddr# :: Addr# -> Int# -> Int# -> Char -> State# s -> State# s | |
Random Char | |
Uniform Char | |
Defined in System.Random.Internal | |
UniformRange Char | |
Defined in System.Random.Internal | |
Extract String | |
ErrorList Char | |
Defined in Control.Monad.Trans.Error | |
Unbox Char | |
Defined in Data.Vector.Unboxed.Base | |
IArray UArray Char | |
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Char -> (i, i) numElements :: Ix i => UArray i Char -> Int unsafeArray :: Ix i => (i, i) -> [(Int, Char)] -> UArray i Char unsafeAt :: Ix i => UArray i Char -> Int -> Char unsafeReplace :: Ix i => UArray i Char -> [(Int, Char)] -> UArray i Char unsafeAccum :: Ix i => (Char -> e' -> Char) -> UArray i Char -> [(Int, e')] -> UArray i Char unsafeAccumArray :: Ix i => (Char -> e' -> Char) -> Char -> (i, i) -> [(Int, e')] -> UArray i Char | |
ToBuilder Char Builder | |
Defined in Data.Builder | |
ToBuilder Char Builder | |
Defined in Data.Builder | |
ConvertibleStrings LazyByteString String | |
Defined in Data.String.Conversions Methods convertString :: LazyByteString -> String # | |
ConvertibleStrings LazyText String | |
Defined in Data.String.Conversions Methods convertString :: LazyText -> String # | |
ConvertibleStrings StrictByteString String | |
Defined in Data.String.Conversions Methods convertString :: StrictByteString -> String # | |
ConvertibleStrings StrictText String | |
Defined in Data.String.Conversions Methods convertString :: StrictText -> String # | |
ConvertibleStrings String LazyByteString | |
Defined in Data.String.Conversions Methods convertString :: String -> LazyByteString # | |
ConvertibleStrings String LazyText | |
Defined in Data.String.Conversions Methods convertString :: String -> LazyText # | |
ConvertibleStrings String StrictByteString | |
Defined in Data.String.Conversions Methods convertString :: String -> StrictByteString # | |
ConvertibleStrings String StrictText | |
Defined in Data.String.Conversions Methods convertString :: String -> StrictText # | |
ConvertibleStrings String String | |
Defined in Data.String.Conversions Methods convertString :: String -> String # | |
Lift Char | |
Vector Vector Char | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Char -> m (Vector Char) basicUnsafeThaw :: PrimMonad m => Vector Char -> m (Mutable Vector (PrimState m) Char) basicLength :: Vector Char -> Int basicUnsafeSlice :: Int -> Int -> Vector Char -> Vector Char basicUnsafeIndexM :: Monad m => Vector Char -> Int -> m Char basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Char -> Vector Char -> m () | |
MVector MVector Char | |
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Char -> Int basicUnsafeSlice :: Int -> Int -> MVector s Char -> MVector s Char basicOverlaps :: MVector s Char -> MVector s Char -> Bool basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Char) basicInitialize :: PrimMonad m => MVector (PrimState m) Char -> m () basicUnsafeReplicate :: PrimMonad m => Int -> Char -> m (MVector (PrimState m) Char) basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Char -> Int -> m Char basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Char -> Int -> Char -> m () basicClear :: PrimMonad m => MVector (PrimState m) Char -> m () basicSet :: PrimMonad m => MVector (PrimState m) Char -> Char -> m () basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Char -> MVector (PrimState m) Char -> m () basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Char -> MVector (PrimState m) Char -> m () basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Char -> Int -> m (MVector (PrimState m) Char) | |
KnownSymbol n => Reifies (n :: Symbol) String | |
Defined in Data.Reflection | |
Cons Text Text Char Char | |
Cons Text Text Char Char | |
Defined in Control.Lens.Cons | |
Snoc Text Text Char Char | |
Snoc Text Text Char Char | |
Defined in Control.Lens.Cons | |
Generic1 (URec Char :: k -> Type) | |
Foldable (UChar :: Type -> Type) | |
Defined in Data.Foldable Methods fold :: Monoid m => UChar m -> m foldMap :: Monoid m => (a -> m) -> UChar a -> m foldMap' :: Monoid m => (a -> m) -> UChar a -> m foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # toList :: UChar a -> [a] elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |
Traversable (UChar :: Type -> Type) | |
Defined in Data.Traversable | |
FromField [Char] | |
Defined in Database.PostgreSQL.Simple.FromField | |
ToField [Char] | |
Defined in Database.PostgreSQL.Simple.ToField | |
MArray (STUArray s) Char (ST s) | |
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Char -> ST s (i, i) getNumElements :: Ix i => STUArray s i Char -> ST s Int newArray :: Ix i => (i, i) -> Char -> ST s (STUArray s i Char) newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) unsafeRead :: Ix i => STUArray s i Char -> Int -> ST s Char unsafeWrite :: Ix i => STUArray s i Char -> Int -> Char -> ST s () | |
Functor (URec Char :: Type -> Type) | |
Generic (URec Char p) | |
Show (URec Char p) | |
Eq (URec Char p) | |
Ord (URec Char p) | |
Defined in GHC.Generics | |
type NatNumMaxBound Char | |
Defined in Basement.Nat type NatNumMaxBound Char = 1114111 | |
type Difference Char | |
Defined in Basement.Numerical.Subtractive | |
type PrimSize Char | |
Defined in Basement.PrimType type PrimSize Char = 4 | |
newtype Vector Char | |
Defined in Data.Vector.Unboxed.Base | |
data URec Char (p :: k) | |
Defined in GHC.Generics | |
newtype MVector s Char | |
Defined in Data.Vector.Unboxed.Base | |
type Compare (a :: Char) (b :: Char) | |
Defined in Data.Type.Ord | |
type Rep1 (URec Char :: k -> Type) | |
Defined in GHC.Generics | |
type Rep (URec Char p) | |
Defined in GHC.Generics |
Instances
MonadFail IO | |
Defined in Control.Monad.Fail | |
MonadIO IO | |
Defined in Control.Monad.IO.Class | |
Alternative IO | |
Applicative IO | |
Functor IO | |
Monad IO | |
MonadPlus IO | |
PrimMonad IO | |
Defined in Basement.Monad Methods primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a primThrow :: Exception e => e -> IO a unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) primVarNew :: a -> IO (PrimVar IO a) primVarRead :: PrimVar IO a -> IO a primVarWrite :: PrimVar IO a -> a -> IO () | |
MonadCatch IO | |
MonadMask IO | |
MonadThrow IO | |
Defined in Control.Monad.Catch | |
Example Expectation | |
Defined in Test.Hspec.Core.Example Associated Types type Arg Expectation Methods evaluateExample :: Expectation -> Params -> (ActionWith (Arg Expectation) -> IO ()) -> ProgressCallback -> IO Result | |
PrimBase IO | |
PrimMonad IO | |
Quasi IO | |
Defined in Language.Haskell.TH.Syntax Methods qReport :: Bool -> String -> IO () qRecover :: IO a -> IO a -> IO a qLookupName :: Bool -> String -> IO (Maybe Name) qReifyFixity :: Name -> IO (Maybe Fixity) qReifyType :: Name -> IO Type qReifyInstances :: Name -> [Type] -> IO [Dec] qReifyRoles :: Name -> IO [Role] qReifyAnnotations :: Data a => AnnLookup -> IO [a] qReifyModule :: Module -> IO ModuleInfo qReifyConStrictness :: Name -> IO [DecidedStrictness] qGetPackageRoot :: IO FilePath qAddDependentFile :: FilePath -> IO () qAddTempFile :: String -> IO FilePath qAddTopDecls :: [Dec] -> IO () qAddForeignFilePath :: ForeignSrcLang -> String -> IO () qAddModFinalizer :: Q () -> IO () qAddCorePlugin :: String -> IO () qGetQ :: Typeable a => IO (Maybe a) qPutQ :: Typeable a => a -> IO () qIsExtEnabled :: Extension -> IO Bool qExtsEnabled :: IO [Extension] | |
Quote IO | |
Defined in Language.Haskell.TH.Syntax | |
MonadUnliftIO IO | |
Defined in Control.Monad.IO.Unlift | |
MonadBaseControl IO IO | |
Defined in Control.Monad.Trans.Control Associated Types type StM IO a | |
MonadBaseControl IO Sh | |
Defined in Shelly.Base Associated Types type StM Sh a | |
MonadBase IO IO | |
Defined in Control.Monad.Base | |
MonadBase IO Sh | |
Defined in Shelly.Base | |
MArray IOArray e IO | |
Defined in Data.Array.Base Methods getBounds :: Ix i => IOArray i e -> IO (i, i) getNumElements :: Ix i => IOArray i e -> IO Int newArray :: Ix i => (i, i) -> e -> IO (IOArray i e) newArray_ :: Ix i => (i, i) -> IO (IOArray i e) unsafeNewArray_ :: Ix i => (i, i) -> IO (IOArray i e) unsafeRead :: Ix i => IOArray i e -> Int -> IO e unsafeWrite :: Ix i => IOArray i e -> Int -> e -> IO () | |
Monoid a => Monoid (IO a) | |
Semigroup a => Semigroup (IO a) | |
Default a => Default (IO a) | |
Defined in Data.Default.Class | |
(TypeError ('Text "Use 'let x = param \"..\"' instead of 'x <- param \"..\"'") :: Constraint) => ParamReader (IO param) Source # | Custom error hint when the Example: action Example = do myParam <- param "hello" Now a custom type error will be shown telling the user to use |
Defined in IHP.Controller.Param Methods readParameter :: ByteString -> Either ByteString (IO param) Source # readParameterJSON :: Value -> Either ByteString (IO param) Source # | |
MonoFunctor (IO a) | |
MonoPointed (IO a) | |
Example (a -> Expectation) | |
Defined in Test.Hspec.Core.Example Associated Types type Arg (a -> Expectation) Methods evaluateExample :: (a -> Expectation) -> Params -> (ActionWith (Arg (a -> Expectation)) -> IO ()) -> ProgressCallback -> IO Result | |
type PrimState IO | |
Defined in Basement.Monad | |
type PrimVar IO | |
Defined in Basement.Monad | |
type Arg Expectation | |
Defined in Test.Hspec.Core.Example type Arg Expectation = () | |
type PrimState IO | |
Defined in Control.Monad.Primitive | |
type StM IO a | |
Defined in Control.Monad.Trans.Control type StM IO a = a | |
type Element (IO a) | |
Defined in Data.MonoTraversable | |
type Arg (a -> Expectation) | |
Defined in Test.Hspec.Core.Example type Arg (a -> Expectation) = a |
Minimal complete definition
showsPrec | show