Hoogle Search

Within Stackage Nightly 2025-10-06 (ghc-9.12.2)

Note that Stackage only displays results for the latest LTS and Nightly snapshot. Learn more.

  1. SomeCheckedDatabaseSettings :: forall be (db :: (Type -> Type) -> Type) . Database be db => CheckedDatabaseSettings be db -> SomeCheckedDatabaseSettings

    beam-migrate Database.Beam.Migrate.Backend

    No documentation available.

  2. defaultMigratableDbSettings :: (Generic (CheckedDatabaseSettings be db), GAutoMigratableDb be (Rep (CheckedDatabaseSettings be db))) => CheckedDatabaseSettings be db

    beam-migrate Database.Beam.Migrate.Generics

    Produce a checked database for the given Haskell database type See the manual for more information on the defaults.

  3. referentialActionSetDefaultSyntax :: IsSql92ReferentialActionSyntax refAction => refAction

    beam-migrate Database.Beam.Migrate.SQL.SQL92

    No documentation available.

  4. referentialActionSetNullSyntax :: IsSql92ReferentialActionSyntax refAction => refAction

    beam-migrate Database.Beam.Migrate.SQL.SQL92

    No documentation available.

  5. type CheckedDatabaseSettings be (db :: Type -> Type -> Type) = db CheckedDatabaseEntity be db

    beam-migrate Database.Beam.Migrate.Types

    The type of a checked database descriptor. Conceptually, this is just a DatabaseSettings with a set of predicates. Use unCheckDatabase to get the regular DatabaseSettings object and collectChecks to access the predicates.

  6. module Data.BitSetWord8

    Space efficient set of Word8 and some pre-canned sets useful for parsing HTTP related ByteString. This packaged is intended to provide O(1) membership test on any subset of ASCII and Latin-1 character set in order to write efficient HTTP related parser.

    Creating your own set

    You can create your own set by fromList.
    myCharSet :: BitSetWord8
    myCharSet = fromList [ Y, y, N, n ]
    
    You can create pre-evaluated set using Template Haskell.
    {-# LANGUAGE TemplateHaskell #-}
    import Language.Haskell.TH.Syntax (Lift, lift)
    
    myPreEvaluatedCharSet :: BitSetWord8
    myPreEvaluatedCharSet = $(lift myCharSet)
    

    Example Usage

    import Data.Attoparsec.ByteString
    
    -- | Parse RFC7230 token.
    token :: Parser ByteString
    token = takeWhile1 (member rfc7230TChar)
    

  7. data BitSetWord8

    bitset-word8 Data.BitSetWord8

    Bitwise set of Word8. Space efficient backend and O(1) membership test.

  8. module Data.BitSetWord8.CharSets

    Some pre-canned character sets useful for HTTP related parsing. All sets provided by this module are evaluated at compile time using Template Haskell.

  9. data BitSetWord8

    bitset-word8 Data.BitSetWord8.Internal

    Bitwise set of Word8. Space efficient backend and O(1) membership test.

  10. BitSetWord8 :: Word64 -> Word64 -> Word64 -> Word64 -> BitSetWord8

    bitset-word8 Data.BitSetWord8.Internal

    No documentation available.

Page 142 of many | Previous | Next