Safe Haskell | None |
---|---|
Language | GHC2024 |
Napkin.Backends.MsSql
Synopsis
- module Napkin.Run.Effects.Languages.Backend.MsSql
- module Napkin.Run.MsSql
- module Napkin.Types.MsSql
- module Napkin.Untyped.Ops.MsSql
- binary :: Ref Function -> SExp -> SExp -> SExp
- data Hook b = Hook {}
- class Applicative f => Alternative (f :: Type -> Type) where
- void :: Functor f => f a -> f ()
- class MonadIO m => Katip (m :: Type -> Type) where
- getLogEnv :: m LogEnv
- localLogEnv :: (LogEnv -> LogEnv) -> m a -> m a
- data Verbosity
- data Type
- asBool :: SExp -> SExp
- data AssertionSeverity
- data TableSpec b = TableSpec {
- table :: SpecTableName
- action :: SpecProgram b
- preHooks :: [Hook b]
- postHooks :: [Hook b]
- update :: [UpdateStrategy]
- tags :: Set TableSpecTag
- data CreateTableAs b = CreateTableAs {
- meta :: BackendTableMeta b
- name :: SpecTableName
- query :: Query
- data Query
- = Query {
- _queryWith :: WithClauses
- _querySelect :: [Alias SExp]
- _queryComments :: [ColumnComment]
- _queryFrom :: Maybe From
- _queryTableOperator :: Maybe ParensOperator
- _queryWhere :: Maybe SExp
- _queryHaving :: Maybe SExp
- _queryGroup :: GroupBy
- _queryOrder :: Order
- _queryLimit :: Maybe Int
- _queryOffset :: Maybe Int
- _queryDistinct :: Distinctness
- _queryAs :: AsStruct
- | Union { }
- | QueryRaw RawQuery
- | NativeQuery NativeQuery
- = Query {
- describe :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r a -> Sem r a
- data Name
- ($) :: (a -> b) -> a -> b
- (++) :: [a] -> [a] -> [a]
- (.) :: (b -> c) -> (a -> b) -> a -> c
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- ap :: Monad m => m (a -> b) -> m a -> m b
- const :: a -> b -> a
- flip :: (a -> b -> c) -> b -> a -> c
- join :: Monad m => m (m a) -> m a
- liftM :: Monad m => (a1 -> r) -> m a1 -> m r
- liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r
- map :: (a -> b) -> [a] -> [b]
- when :: Applicative f => Bool -> f () -> f ()
- filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a]
- foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b
- guard :: Alternative f => Bool -> f ()
- unless :: Applicative f => Bool -> f () -> f ()
- and :: [SExp] -> SExp
- or :: [SExp] -> SExp
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- fst :: (a, b) -> a
- snd :: (a, b) -> b
- undefined :: HasCallStack => a
- zip :: [a] -> [b] -> [(a, b)]
- not :: SExp -> SExp
- class Functor f => Applicative (f :: Type -> Type) where
- class Functor (f :: Type -> Type) where
- class Applicative m => Monad (m :: Type -> Type) where
- class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where
- class Semigroup a => Monoid a where
- class Semigroup a where
- class Monad m => MonadFail (m :: Type -> Type) where
- sum :: SExp -> SExp
- newtype Const a (b :: k) = Const {
- getConst :: a
- 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]
- data Int16
- data Int32
- data Int64
- data Int8
- class Num a where
- class Read a where
- class Num a => Fractional a where
- (/) :: a -> a -> a
- recip :: a -> a
- fromRational :: Rational -> a
- class Show a where
- class Eq a where
- max :: SExp -> SExp
- min :: SExp -> SExp
- type String = [Char]
- data Maybe a
- data Bool
- data Char
- data Double
- data Int
- newtype Environment = Environment {}
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- data AggLevel
- assert :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> AssertionStatus -> Sem r ()
- assertError :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem ((Error Text :: (Type -> Type) -> Type -> Type) ': r) () -> Sem r ()
- integral :: (Integral a, Integral b) => Iso' a b
- optional :: Alternative f => f a -> f (Maybe a)
- data SExp
- = Lit Value
- | Var (Ref SExp)
- | ArraySelect Query
- | ArrayItem { }
- | Array { }
- | Struct { }
- | FieldAccess { }
- | Extern ExternFun
- | Case [(SExp, SExp)] SExp
- | ExceptColumns SExp [Ref SExp]
- | SubQuery Query
- | NativeExpr NativeExpr
- count :: SExp -> SExp
- data Field = Field Nullability Type
- class (Eq (BackendSchemaField bk), Show (BackendSchemaField bk)) => HasBackendSchemaField (bk :: k) where
- fieldName :: BackendSchemaField bk -> Text
- fieldType :: BackendSchemaField bk -> Type
- data SQLDialect
- data DatePart
- data AssertionStatus
- data Assertion (m :: k) a where
- Assert' :: forall {k} (m :: k). AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Assertion m ()
- sign :: SExp -> SExp
- data SpecRuntime b = SpecRuntime {
- connection :: BackendConn b
- data Function
- (.&&.) :: SExp -> SExp -> SExp
- (.||.) :: SExp -> SExp -> SExp
- data Specs b = Specs {}
- data Value
- data Text
- data WithSpecTable a = WithSpecTable {
- specTableName :: SpecTableName
- value :: a
- data UTCTime = UTCTime {
- utctDay :: Day
- utctDayTime :: DiffTime
- newtype Q a = Q {}
- (<**>) :: Applicative f => f a -> f (a -> b) -> f b
- nil :: SExp
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- type Year = Integer
- getCurrentTime :: forall (effs :: EffectRow). Member (Time :: (Type -> Type) -> Type -> Type) effs => Sem effs UTCTime
- liftA :: Applicative f => (a -> b) -> f a -> f b
- liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d
- sequence :: (Traversable t, Monad m) => t (m a) -> m (t a)
- mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b)
- liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r
- liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r
- liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r
- asum :: (Foldable t, Alternative f) => t (f a) -> f a
- msum :: (Foldable t, MonadPlus m) => t (m a) -> m a
- cast :: SExp -> Type -> SExp
- forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b)
- (>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c
- (<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c
- forever :: Applicative f => f a -> f b
- mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c])
- zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c]
- zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m ()
- foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m ()
- replicateM :: Applicative m => Int -> m a -> m [a]
- replicateM_ :: Applicative m => Int -> m a -> m ()
- (<$!>) :: Monad m => (a -> b) -> m a -> m b
- mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a
- newtype ZipList a = ZipList {
- getZipList :: [a]
- data Item a = Item {}
- newtype WrappedArrow (a :: Type -> Type -> Type) b c = WrapArrow {
- unwrapArrow :: a b c
- newtype WrappedMonad (m :: Type -> Type) a = WrapMonad {
- unwrapMonad :: m a
- data ExternFun
- = SimpleExtern (Ref Function) [SExp]
- | ParensExtern [ParensOperator]
- | ModExtern (Ref Function) [SExp] [FunModifier]
- | Cast SExp Type
- | SafeCast SExp Type
- | ExternRaw Text
- data From = From (Selected Relation) [(Selected Relation, JoinType, Either (Maybe SExp) [Ref SExp])]
- isEmpty :: SExp -> SExp
- table :: forall {k} (a :: k). Ref a -> Relation
- var :: forall {k} (a :: k). Ref a -> SExp
- multiple :: Ref Function -> [SExp] -> SExp
- data InsertStatement = Insert {
- names :: NonEmpty Name
- columnNames :: Maybe [Name]
- source :: InsertSource
- data External (m :: k) a where
- ExecuteExternalCommand' :: forall {k} (m :: k). ExternalCommand -> External m (Either Text ExitCode)
- external :: forall {k} (b :: k) (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type] r => Set (Ref Table) -> ExternalCommand -> Sem r ()
- data Table
- class Default a where
- def :: a
- data DiffTime
- dropView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r ()
- data TimeLocale = TimeLocale {}
- data CreateTableDDL = CreateTableDDL {
- names :: NonEmpty Name
- columns :: [TableElement]
- substitute :: forall (r :: EffectRow). Member (Template :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> SqlTemplateVariables -> Sem r (Either TemplateError Text)
- newtype LogStr = LogStr {}
- type Partition = [SExp]
- data NominalDiffTime
- asInt :: SExp -> SExp
- dayOfWeek :: Day -> DayOfWeek
- never :: SExp
- data Annotation
- = TableAnnotation Text
- | ColumnsAnnotations (Map (Ref SExp) Text)
- assertM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r AssertionStatus -> Sem r ()
- notNull :: SExp -> SExp
- data Severity
- logMsg :: (Applicative m, Katip m) => Namespace -> Severity -> LogStr -> m ()
- logInfo :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- class Backend b where
- backendConnectionString :: BackendConn b -> ConnectionString
- backendExecute :: (MonadNapkin b m, RenderSql command b) => BackendConn b -> command -> m ()
- backendQuery :: (MonadNapkin b m, RenderSql q b) => BackendConn b -> q -> m [Map Text Value]
- backendCheckTableExists :: MonadNapkin b m => BackendConn b -> Ref Table -> m Bool
- backendGetTableKind :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableKind
- backendGetRelationSchema :: MonadNapkin b m => BackendConn b -> Ref Table -> Relation -> m [BackendSchemaField b]
- backendGetAnnotations :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableAnnotations
- backendAnnotate :: MonadNapkin b m => BackendConn b -> Ref Table -> Annotation -> m ()
- backendCreateAs :: (MonadNapkin b m, RenderSql command b, command ~ CreateRelation b) => BackendConn b -> command -> m ()
- backendCreate :: (MonadNapkin b m, RenderSql command b, command ~ CreateTableSchema b) => BackendConn b -> command -> m ()
- backendCopyTable :: (Default (BackendMeta 'KindTable b), MonadNapkin b m, RenderSql (CreateRelation b) b, RenderSql DeleteRows b, RenderSql InsertInto b) => BackendConn b -> Ref Table -> Ref Table -> TableWriteStrategy -> m ()
- backendDrop :: MonadNapkin b m => BackendConn b -> DropRelation -> m ()
- backendInsertInto :: (MonadNapkin b m, RenderSql command b, command ~ InsertInto) => BackendConn b -> command -> m ()
- backendRename :: MonadNapkin b m => BackendConn b -> RenameRelation -> m ()
- backendListTables :: MonadNapkin b m => BackendConn b -> ListTables -> m (Set ListedTable)
- backendNormalize :: MonadNapkin b m => BackendConn b -> NormalizeTableNames -> m (Map (Ref Table) NormalizedTable)
- backendAddColumn :: (MonadNapkin b m, RenderSql command b, command ~ AddColumnToTable) => BackendConn b -> command -> m ()
- backendDropColumn :: (MonadNapkin b m, RenderSql command b, command ~ DropColumnFromTable) => BackendConn b -> command -> m ()
- order :: SExp -> OrderPart
- if_ :: SExp -> SExp -> SExp -> SExp
- data CompareCount
- addDependency :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r ()
- data Alias a = Alias {
- _aliasRef :: Maybe (Ref a)
- _aliasItem :: a
- getAnnotations :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableAnnotations
- class Val a where
- data QState = QState {}
- type Time = Input UTCTime :: k1 -> Type -> Type
- logError :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logDebug :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- data UState = UState {
- vars :: RefStore
- query :: UpdateQuery
- data SqlParseError = SqlParseError {}
- interval :: [(Double, DatePart)] -> SExp
- data AssertionEntry = AssertionEntry {}
- newtype Day = ModifiedJulianDay {}
- data TimeOfDay = TimeOfDay {}
- type GroupBy = [SExp]
- newtype Namespace = Namespace {
- unNamespace :: [Text]
- class WithName (a :: Type -> Type) where
- data DayOfWeek
- pattern January :: MonthOfYear
- pattern February :: MonthOfYear
- pattern March :: MonthOfYear
- pattern April :: MonthOfYear
- pattern May :: MonthOfYear
- pattern June :: MonthOfYear
- pattern July :: MonthOfYear
- pattern August :: MonthOfYear
- pattern September :: MonthOfYear
- pattern October :: MonthOfYear
- pattern November :: MonthOfYear
- pattern December :: MonthOfYear
- isLeapYear :: Year -> Bool
- data LocalTime = LocalTime {}
- data SpecDependency
- (/.) :: SExp -> SExp -> SExp
- renderQuery :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => Query -> Sem r SqlText
- newtype ThreadIdText = ThreadIdText {}
- renderSeverity :: Severity -> Text
- textToSeverity :: Text -> Maybe Severity
- logStr :: StringConv a Text => a -> LogStr
- ls :: StringConv a Text => a -> LogStr
- showLS :: Show a => a -> LogStr
- data LogEnv = LogEnv {}
- data Scribe = Scribe {
- liPush :: forall a. LogItem a => Item a -> IO ()
- scribeFinalizer :: IO ()
- scribePermitItem :: !PermitFunc
- type PermitFunc = forall a. Item a -> IO Bool
- data SimpleLogPayload
- type LogItem = SimpleLogPayload
- payloadKeys :: LogItem a => Verbosity -> a -> PayloadSelection
- class ToObject a where
- data PayloadSelection
- itemApp :: forall a f. Functor f => (Namespace -> f Namespace) -> Item a -> f (Item a)
- itemEnv :: forall a f. Functor f => (Environment -> f Environment) -> Item a -> f (Item a)
- itemHost :: forall a f. Functor f => (HostName -> f HostName) -> Item a -> f (Item a)
- itemLoc :: forall a f. Functor f => (Maybe Loc -> f (Maybe Loc)) -> Item a -> f (Item a)
- itemMessage :: forall a f. Functor f => (LogStr -> f LogStr) -> Item a -> f (Item a)
- itemNamespace :: forall a f. Functor f => (Namespace -> f Namespace) -> Item a -> f (Item a)
- itemPayload :: forall a1 a2 f. Functor f => (a1 -> f a2) -> Item a1 -> f (Item a2)
- itemProcess :: forall a f. Functor f => (ProcessID -> f ProcessID) -> Item a -> f (Item a)
- itemSeverity :: forall a f. Functor f => (Severity -> f Severity) -> Item a -> f (Item a)
- itemThread :: forall a f. Functor f => (ThreadIdText -> f ThreadIdText) -> Item a -> f (Item a)
- itemTime :: forall a f. Functor f => (UTCTime -> f UTCTime) -> Item a -> f (Item a)
- sl :: ToJSON a => Text -> a -> SimpleLogPayload
- payloadObject :: LogItem a => Verbosity -> a -> Object
- itemJson :: LogItem a => Verbosity -> Item a -> Value
- permitAND :: PermitFunc -> PermitFunc -> PermitFunc
- permitOR :: PermitFunc -> PermitFunc -> PermitFunc
- permitItem :: Monad m => Severity -> Item a -> m Bool
- data ScribeSettings
- logEnvApp :: Lens' LogEnv Namespace
- logEnvEnv :: Lens' LogEnv Environment
- logEnvHost :: Lens' LogEnv HostName
- logEnvPid :: Lens' LogEnv ProcessID
- logEnvScribes :: Lens' LogEnv (Map Text ScribeHandle)
- logEnvTimer :: Lens' LogEnv (IO UTCTime)
- initLogEnv :: Namespace -> Environment -> IO LogEnv
- registerScribe :: Text -> Scribe -> ScribeSettings -> LogEnv -> IO LogEnv
- newtype KatipT (m :: Type -> Type) a = KatipT {}
- scribeBufferSize :: Lens' ScribeSettings Int
- defaultScribeSettings :: ScribeSettings
- unregisterScribe :: Text -> LogEnv -> LogEnv
- clearScribes :: LogEnv -> LogEnv
- closeScribe :: Text -> LogEnv -> IO LogEnv
- closeScribes :: LogEnv -> IO LogEnv
- runKatipT :: LogEnv -> KatipT m a -> m a
- katipNoLogging :: Katip m => m a -> m a
- logItem :: (Applicative m, LogItem a, Katip m) => a -> Namespace -> Maybe Loc -> Severity -> LogStr -> m ()
- logKatipItem :: (Applicative m, LogItem a, Katip m) => Item a -> m ()
- logF :: (Applicative m, LogItem a, Katip m) => a -> Namespace -> Severity -> LogStr -> m ()
- logException :: (Katip m, LogItem a, MonadCatch m, Applicative m) => a -> Namespace -> Severity -> m b -> m b
- logT :: ExpQ
- logLoc :: (Applicative m, LogItem a, Katip m, HasCallStack) => a -> Namespace -> Severity -> LogStr -> m ()
- data KatipContextT (m :: Type -> Type) a
- class Katip m => KatipContext (m :: Type -> Type) where
- getKatipContext :: m LogContexts
- localKatipContext :: (LogContexts -> LogContexts) -> m a -> m a
- getKatipNamespace :: m Namespace
- localKatipNamespace :: (Namespace -> Namespace) -> m a -> m a
- data LogContexts
- data AnyLogContext
- liftPayload :: LogItem a => a -> LogContexts
- logItemM :: (Applicative m, KatipContext m, HasCallStack) => Maybe Loc -> Severity -> LogStr -> m ()
- logFM :: (Applicative m, KatipContext m) => Severity -> LogStr -> m ()
- logTM :: ExpQ
- logLocM :: (Applicative m, KatipContext m, HasCallStack) => Severity -> LogStr -> m ()
- logExceptionM :: (KatipContext m, MonadCatch m, Applicative m) => m a -> Severity -> m a
- runKatipContextT :: LogItem c => LogEnv -> c -> Namespace -> KatipContextT m a -> m a
- katipAddNamespace :: KatipContext m => Namespace -> m a -> m a
- katipAddContext :: (LogItem i, KatipContext m) => i -> m a -> m a
- type ItemFormatter a = Bool -> Verbosity -> Item a -> Builder
- data ColorStrategy
- mkHandleScribe :: ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe
- mkHandleScribeWithFormatter :: (forall a. LogItem a => ItemFormatter a) -> ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe
- mkFileScribe :: FilePath -> PermitFunc -> Verbosity -> IO Scribe
- bracketFormat :: LogItem a => ItemFormatter a
- jsonFormat :: LogItem a => ItemFormatter a
- is :: SExp -> SExp -> SExp
- (<.) :: SExp -> SExp -> SExp
- data AsStruct
- _Array :: Prism' SExp (Maybe Type, [SExp])
- bqSQL :: QuasiQuoter
- bqSQLSExp :: QuasiQuoter
- bqSQLSelExps :: QuasiQuoter
- bqSQLFrom :: QuasiQuoter
- bqSQLRel :: QuasiQuoter
- debugSql' :: forall {k} (b :: k) a. RenderSql a b => a -> Unshow
- renderSql' :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text
- renderSqlCollapsed :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text
- renderSqlErr :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Either Text Text
- renderSqlWith :: forall {k} a (b :: k). RenderSql a b => Style -> Proxy b -> a -> Text
- styleCollapsed :: Style
- class RenderSql a (backend :: k) where
- data RenderedSql = RenderSql a backend => RenderedSql (Proxy backend) a
- newtype Unshow = Unshow Text
- data family BackendSpecificEffect b :: Effect
- scopeGeneric :: [(Ref Function, SExp)] -> SExp -> SExp -> SExp
- data NullStrategy
- msSQL :: QuasiQuoter
- msSQLSExp :: QuasiQuoter
- msSQLSelExps :: QuasiQuoter
- msSQLFrom :: QuasiQuoter
- msSQLRel :: QuasiQuoter
- pgSQL :: QuasiQuoter
- pgSQLSExp :: QuasiQuoter
- pgSQLSelExps :: QuasiQuoter
- pgSQLFrom :: QuasiQuoter
- pgSQLRel :: QuasiQuoter
- rsSQL :: QuasiQuoter
- rsSQLSExp :: QuasiQuoter
- rsSQLSelExps :: QuasiQuoter
- rsSQLFrom :: QuasiQuoter
- rsSQLRel :: QuasiQuoter
- npgSQL :: QuasiQuoter
- npgSQLSExp :: QuasiQuoter
- _name :: Iso' Text Name
- class IsRef a where
- checkTableExists :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r Bool
- data Relation
- = TableRelation (Ref Table)
- | QueryRelation Query
- | ArrayRelation SExp (Maybe Name)
- | RawRelation [Ref Table] Text
- slSQL :: QuasiQuoter
- slSQLSExp :: QuasiQuoter
- slSQLSelExps :: QuasiQuoter
- slSQLFrom :: QuasiQuoter
- slSQLRel :: QuasiQuoter
- renameTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> Sem r ()
- newtype RandomToken = RandomToken {}
- class MaybeQuery s where
- class HasDefinition s where
- class AsRelation s where
- asRelation :: s -> Relation
- data DefinedQuery = HasDefinition s => DefinedQuery s
- data DefinedRelation = (AsRelation s, HasDefinition s, MaybeQuery s) => DefinedRelation s
- data NativeQuery
- type ColumnComment = (Ref SExp, Text)
- data ParensOperator = ParensOperator [Ref Function] [ParensOperatorArgument]
- data ParensOperatorArgument
- type Keyword = Ref Function
- data WithClauses = WithClauses {}
- data CteBody
- = JustCteBody (Selected Query)
- | PositionalBoundsCteBody (NonEmpty (Ref SExp)) (Selected Query)
- data RawQuery = RawQuery {
- _rawQuery_deps :: [Ref Table]
- _rawQuery_raw :: Text
- data UnionType
- data JoinType
- data OrderPart = OrderPart {}
- data NullOrder
- data OrderDir
- type Order = [OrderPart]
- type OriginTypeName = Text
- data FunModifier
- data FrameLength
- data WindowFrame
- data WindowFrameUnit
- data WOver = WOver {}
- data Distinctness
- data NativeExpr
- data Nullability
- data ArrayBase
- data IntInterval = IntInterval SExp DatePart
- newtype Interval = Interval {
- _unInterval :: [(SExp, DatePart)]
- data StructField
- data Selected a = Selected {
- _selectRef :: Ref a
- _selectItem :: a
- newtype SpecTableName = SpecTableName {}
- newtype TemporaryTableName = TemporaryTableName (Ref Table)
- newtype Ref (a :: k) = Ref {}
- data TableKind
- textName :: Text -> Name
- nameText :: Name -> Text
- nameTextQuoted :: Name -> Text
- text2Ref :: forall {k} (a :: k). Text -> Ref a
- useSpecName :: SpecTableName -> Ref Table
- refComponentCount :: forall {k} (a :: k). Ref a -> Int
- textRefIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p Text (f Text)
- refTextIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p Text (f Text) -> p (Ref a) (f (Ref a))
- refNameIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p (NonEmpty Name) (f (NonEmpty Name))
- textRef :: forall {k} (a :: k). Text -> Ref a
- nameRef :: forall {k} (a :: k). Name -> Ref a
- namesRef :: forall {k} (a :: k). [Name] -> Ref a
- sNamesRef :: forall {k} (a :: k). NonEmpty Name -> Ref a
- sNameRef :: forall {k} (a :: k). Name -> Ref a
- specTableText :: SpecTableName -> Text
- refText :: forall {k} (t :: k). Ref t -> Text
- retagRef :: forall {k1} {k2} (t :: k1) (a :: k2). Ref t -> Ref a
- appendRef :: forall {k} (a :: k). Ref a -> Name -> Ref a
- star :: SExp
- keywordRef :: Text -> Ref Function
- nonAlias :: a -> Alias a
- sa :: WithName a => Ref b -> b -> a b
- selectToAlias :: Selected a -> Alias a
- varText :: Text -> SExp
- invertOrder :: OrderDir -> OrderDir
- fromAliases :: From -> [Ref Relation]
- orderWithInserted :: WithClauses -> [(Ref Query, CteBody)]
- cteRefs :: forall {k} (a :: k). WithClauses -> Set (Ref a)
- mapSExpOfParensOperatorArg :: (SExp -> SExp) -> ParensOperatorArgument -> ParensOperatorArgument
- emptyQuery :: Query
- mkUnion :: UnionType -> [Query] -> Query
- collectUnionQueries :: Query -> NonEmpty Query
- queryFullySpecified :: Data a => a -> Bool
- opExp :: Lens' OrderPart SExp
- opNulls :: Lens' OrderPart (Maybe NullOrder)
- opOrder :: Lens' OrderPart OrderDir
- rawQuery_deps :: Lens' RawQuery [Ref Table]
- rawQuery_raw :: Lens' RawQuery Text
- queryAs :: Traversal' Query AsStruct
- queryComments :: Traversal' Query [ColumnComment]
- queryDistinct :: Traversal' Query Distinctness
- queryFrom :: Traversal' Query (Maybe From)
- queryGroup :: Traversal' Query GroupBy
- queryHaving :: Traversal' Query (Maybe SExp)
- queryLimit :: Traversal' Query (Maybe Int)
- queryOffset :: Traversal' Query (Maybe Int)
- queryOrder :: Traversal' Query Order
- querySelect :: Traversal' Query [Alias SExp]
- queryTableOperator :: Traversal' Query (Maybe ParensOperator)
- queryWhere :: Traversal' Query (Maybe SExp)
- queryWith :: Traversal' Query WithClauses
- unionQuery1 :: Traversal' Query Query
- unionQuery2 :: Traversal' Query Query
- unionType :: Traversal' Query UnionType
- unionWiths :: Traversal' Query WithClauses
- _Query :: Prism' Query (WithClauses, [Alias SExp], [ColumnComment], Maybe From, Maybe ParensOperator, Maybe SExp, Maybe SExp, GroupBy, Order, Maybe Int, Maybe Int, Distinctness, AsStruct)
- _Union :: Prism' Query (UnionType, Query, Query, WithClauses)
- _QueryRaw :: Prism' Query RawQuery
- _NativeQuery :: Prism' Query NativeQuery
- _From :: Iso' From (Selected Relation, [(Selected Relation, JoinType, Either (Maybe SExp) [Ref SExp])])
- _Specific :: Prism' Name Text
- _Star :: Prism' Name ()
- _JoinLeft :: Prism' JoinType ()
- _JoinRight :: Prism' JoinType ()
- _JoinInner :: Prism' JoinType ()
- _JoinCross :: Prism' JoinType ()
- _JoinOuter :: Prism' JoinType ()
- _TableRelation :: Prism' Relation (Ref Table)
- _QueryRelation :: Prism' Relation Query
- _ArrayRelation :: Prism' Relation (SExp, Maybe Name)
- _RawRelation :: Prism' Relation ([Ref Table], Text)
- unRef :: forall k1 (a1 :: k1) k2 (a2 :: k2) p f. (Profunctor p, Functor f) => p (NonEmpty Name) (f (NonEmpty Name)) -> p (Ref a1) (f (Ref a2))
- _VDouble :: Prism' Value Double
- _VInt :: Prism' Value Int64
- _VBool :: Prism' Value Bool
- _VDate :: Prism' Value Day
- _VDateTime :: Prism' Value UTCTime
- _VText :: Prism' Value Text
- _VBinary :: Prism' Value ByteString
- _VInterval :: Prism' Value Interval
- _VNull :: Prism' Value ()
- _VDatePart :: Prism' Value DatePart
- _Millennium :: Prism' DatePart ()
- _Century :: Prism' DatePart ()
- _Decade :: Prism' DatePart ()
- _Epoch :: Prism' DatePart ()
- _Year :: Prism' DatePart ()
- _Quarter :: Prism' DatePart ()
- _Month :: Prism' DatePart ()
- _Week :: Prism' DatePart ()
- _DayOfWeek :: Prism' DatePart ()
- _DayOfYear :: Prism' DatePart ()
- _Day :: Prism' DatePart ()
- _Hour :: Prism' DatePart ()
- _Minute :: Prism' DatePart ()
- _Second :: Prism' DatePart ()
- _Millisecond :: Prism' DatePart ()
- _Microsecond :: Prism' DatePart ()
- _Lit :: Prism' SExp Value
- _Var :: Prism' SExp (Ref SExp)
- _ArraySelect :: Prism' SExp Query
- _ArrayItem :: Prism' SExp (ArrayBase, Nullability, SExp, SExp)
- _Struct :: Prism' SExp (Maybe (OMap StructField Type), OMap StructField SExp)
- _FieldAccess :: Prism' SExp (SExp, StructField)
- _Extern :: Prism' SExp ExternFun
- _Case :: Prism' SExp ([(SExp, SExp)], SExp)
- _ExceptColumns :: Prism' SExp (SExp, [Ref SExp])
- _SubQuery :: Prism' SExp Query
- _NativeExpr :: Prism' SExp NativeExpr
- selectItem :: forall a f. Functor f => (a -> f a) -> Selected a -> f (Selected a)
- selectRef :: forall a f. Functor f => (Ref a -> f (Ref a)) -> Selected a -> f (Selected a)
- aliasItem :: forall a f. Functor f => (a -> f a) -> Alias a -> f (Alias a)
- aliasRef :: forall a f. Functor f => (Maybe (Ref a) -> f (Maybe (Ref a))) -> Alias a -> f (Alias a)
- overFrame :: Lens' WOver (Maybe WindowFrame)
- overOrder :: Lens' WOver Order
- overPartition :: Lens' WOver Partition
- unName :: Traversal' Name Text
- withClauses_cteBodies :: Lens' WithClauses (OMap (Ref Query) CteBody)
- withClauses_recursive :: Lens' WithClauses Bool
- data UpdateQuery = UpdateQuery {}
- class TableRef a where
- _WithClauses :: Iso' WithClauses (Bool, OMap (Ref Query) CteBody)
- allQueryComments :: Lens' Query [ColumnComment]
- refNamespace :: forall {k} (a :: k) f. Functor f => (Maybe Name -> f (Maybe Name)) -> Ref a -> f (Ref a)
- _lit :: Val a => Prism' SExp a
- lit :: Val a => a -> SExp
- txt :: Text -> SExp
- fullWindow :: WOver
- relationRef :: TableRef a => Getter a Relation
- varAs :: forall {k} (a :: k). Ref a -> Selected SExp
- asSelf :: SExp -> Selected SExp
- funAs :: (SExp -> b) -> Ref b -> Selected b
- selectToRef :: Selected SExp -> SExp
- selectedExps :: forall a f. Applicative f => (a -> f a) -> [Selected a] -> f [Selected a]
- selectedNames :: forall a0 f. Applicative f => (Text -> f Text) -> [Selected a0] -> f [Selected a0]
- refName :: forall {k1} {k2} (a :: k1) (a1 :: k2) f. Applicative f => (Text -> f Text) -> Ref a -> f (Ref a1)
- refRoot :: forall {k} (a :: k) f. Functor f => (Name -> f Name) -> Ref a -> f (Ref a)
- refJustRoot :: forall {k} (a :: k). Ref a -> Ref a
- refParentRoot :: forall {k} (a :: k). Ref a -> ([Text], Maybe Text)
- ne :: forall a p f. (Profunctor p, Functor f) => p (NonEmpty a) (f (NonEmpty a)) -> p [a] (f [a])
- selectedName :: forall a f. Applicative f => (Name -> f Name) -> Selected a -> f (Selected a)
- atAlias :: (Applicative f, Choice p) => Ref t -> Optic' p f (Alias t) (Alias t)
- aliasedNames :: HasDefinition s => Traversal' s (Ref SExp)
- viewAliasedNames :: (Applicative f, Contravariant f, MaybeQuery s) => (Ref SExp -> f (Ref SExp)) -> s -> f s
- scopeRefs :: forall {k} b (t :: k). Data b => Ref t -> b -> b
- scopeExps :: forall {k} b (t :: k). Data b => Ref t -> b -> b
- modifyExterns :: Data b => (ExternFun -> SExp) -> b -> b
- (^^.) :: Ref Relation -> Name -> SExp
- type SpecsDepsTables = Map SpecTableName (Set SpecDependency)
- type SpecsDeps = Map SpecNode (Set SpecDependency)
- data SpecNode
- pattern NapkinTableSeparator :: (Eq a, IsString a) => a
- pattern NapkinTablePrefix :: (Eq a, IsString a) => a
- updateQueryFrom :: Lens' UpdateQuery (Maybe From)
- updateQuerySet :: Lens' UpdateQuery (OMap Name SExp)
- updateQueryTarget :: Lens' UpdateQuery (Alias (Ref Table))
- updateQueryWhere :: Lens' UpdateQuery (Maybe SExp)
- isTemporaryTable :: Ref Table -> Bool
- tmpTableNameFormat :: UTCTime -> Text -> Text
- getUTCTimeTemporaryTable :: Ref Table -> Maybe UTCTime
- getTemporaryTableName :: forall {k} m (b :: k). MonadIO m => m (Ref b)
- specNodeText :: SpecNode -> Text
- class FunRenamer a where
- class TableRenamer a where
- renameTableRef :: (Ref Table -> Ref Table) -> a -> a
- data QueryTransformerUnit
- = TableRenamer (Ref Table -> Ref Table)
- | FunctionRenamer (Ref Function -> Ref Function)
- | QueryRewriter (Query -> Query)
- type QueryTransformer = [QueryTransformerUnit]
- qt_refs :: Getter QueryTransformer (Ref Table -> Ref Table)
- isTableRenamer :: QueryTransformerUnit -> Maybe (Ref Table -> Ref Table)
- qt_spec :: Getter QueryTransformer (SpecTableName -> Ref Table)
- qt_func :: Getter QueryTransformer (Ref Function -> Ref Function)
- qt_query :: Getter QueryTransformer (Query -> Query)
- qt_update_query :: Getter QueryTransformer (UpdateQuery -> UpdateQuery)
- qt_data :: Data a => Getter QueryTransformer (a -> a)
- modifyFunctions :: Data b => (Ref Function -> Ref Function) -> b -> b
- class HasDeps a where
- dependenciesSet :: a -> Set (Ref Table)
- traverseDependencies :: Fold a (Ref Table)
- type family Members (es :: [Effect]) (r :: EffectRow) where ...
- data Sem (r :: EffectRow) a
- class Member (t :: Effect) (r :: EffectRow)
- ansi2011SQL :: QuasiQuoter
- ansi2011SQLSExp :: QuasiQuoter
- newtype SqlTemplateVariables = SqlTemplateVariables {}
- sqlTemplate :: [(Text, Value)] -> SqlTemplateVariables
- sqlVar :: ToJSON a => Text -> a -> (Text, Value)
- type FatalError = Error FatalErrorInfo :: (k -> Type) -> k -> Type
- data FatalErrorInfo
- fatalError :: forall (r :: EffectRow) a. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Text -> Sem r a
- orFatalErrorME :: forall (r :: EffectRow) e' v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Either e' v) -> (e' -> Text) -> Sem r v
- orFatalErrorM :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Maybe v) -> Text -> Sem r v
- orFatalError :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Maybe v -> Text -> Sem r v
- data ExternalCommand
- executeExternalCommand' :: forall (r :: EffectRow). Member (External :: (Type -> Type) -> Type -> Type) r => ExternalCommand -> Sem r (Either Text ExitCode)
- executeExternalCommand :: forall (effs :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type] effs => ExternalCommand -> Sem effs ()
- data LocalFile (m :: k) a where
- newtype LocalFileError = LocalFileError Text
- loadFile :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> FilePath -> SqlTemplateVariables -> Sem r a
- type Log = Output LogLine :: k -> Type -> Type
- data LogLine = LogLine Severity LogStr LogItem
- logNotice :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logWarning :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logCritical :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logAlert :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logEmergency :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs ()
- logDebug' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logInfo' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logNotice' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logWarning' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logError' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logCritical' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logAlert' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- logEmergency' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs ()
- runLogKatip :: forall (m :: Type -> Type) (r :: EffectRow) a. (Katip m, Member (Embed m) r) => SimpleLogPayload -> Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a
- runLogDiscard :: forall (r :: [(Type -> Type) -> Type -> Type]) a. Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a
- newtype AssertionLog = AssertionLog [AssertionEntry]
- newtype AssertionGroup = AssertionGroup [Text]
- pattern FailureWithMessage :: Text -> AssertionStatus
- prettyPrintAssertionGroup :: AssertionGroup -> Text -> Text
- hasFailedAssertions :: AssertionLog -> Bool
- filterFailedAssertions :: AssertionLog -> [Text]
- isFailure :: AssertionEntry -> Bool
- prettyPrintAssertionEntry :: AssertionEntry -> Text
- assert' :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Sem r ()
- successIsTrue :: Bool -> AssertionStatus
- assertTrue :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r ()
- assertEquals :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r) => Text -> a -> a -> Sem r ()
- assertEquals' :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r, Show a) => Text -> a -> a -> Sem r ()
- assertTrueWith :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Text -> Sem r ()
- assertTrueWithM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r Text -> Sem r ()
- failedAssertion :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r ()
- warnOnly :: forall (r :: EffectRow) a. Member (Assertion :: (Type -> Type) -> Type -> Type) r => Sem r a -> Sem r a
- describe' :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => [Text] -> Sem r a -> Sem r a
- assertionToAssertionEntry :: forall {k} (r :: k) a. Assertion r a -> AssertionEntry
- data NapkinEffectError
- prettyPrintNapkinEffectError :: NapkinEffectError -> Text
- type SqlIO (m :: Type -> Type) = MonadCatch m
- safeIO :: forall m (r :: EffectRow) v. (Members '[FatalError :: (Type -> Type) -> Type -> Type, Embed m] r, SqlIO m) => m v -> Sem r v
- data SqlRead (b :: k) (m :: k1) a where
- RunQuery :: forall {k} {k1} (b :: k) (m :: k1). Query -> SqlRead b m [Map Text Value]
- CheckTableExists :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m Bool
- GetTableKind :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m TableKind
- GetRelationSchema' :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Relation -> SqlRead b m [BackendSchemaField b]
- newtype SchemaDiffError (bk :: k) = SchemaDiffError (NonEmpty (BackendSchemaField bk))
- data SchemaDiff (bk :: k) = SchemaDiff {
- droppedColumns :: [BackendSchemaField bk]
- addedColumns :: [BackendSchemaField bk]
- runQuery :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Query -> Sem r [Map Text Value]
- getTableKind :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableKind
- getRelationSchema' :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Relation -> Sem r [BackendSchemaField b]
- runQuerySingleAnswer :: forall {k} (b :: k) a (r :: EffectRow). (Member (SqlRead b :: (Type -> Type) -> Type -> Type) r, Val a) => Query -> Sem r (Maybe a)
- getRelationSchema :: forall {k} (b :: k) (r :: EffectRow). Members '[SqlRead b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type] r => Relation -> Sem r [BackendSchemaField b]
- diffRelationSchemas :: forall {k} (b :: k). HasBackendSchemaField b => [BackendSchemaField b] -> [BackendSchemaField b] -> Either (SchemaDiffError b) (SchemaDiff b)
- data SqlRender (m :: k) a where
- RenderSExp :: forall {k} (m :: k). SExp -> SqlRender m Text
- RenderQuery :: forall {k} (m :: k). Query -> SqlRender m Text
- type SqlText = Text
- data SqlRenderCacheKey
- renderSExp :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => SExp -> Sem r SqlText
- data Template (m :: k) a where
- Substitute :: forall {k} (m :: k). SourceLocation -> Text -> SqlTemplateVariables -> Template m (Either TemplateError Text)
- newtype TemplateError = TemplateError Text
- data SqlParse (m :: k) a where
- ParseSqlQuery' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError Query)
- ParseSqlExp' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError SExp)
- ParseSqlStatements' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError [Statement])
- prettyPrintSqlParseError :: SqlParseError -> Text
- data SqlParseCacheKey
- class Stateable a where
- parseSqlQuery' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError Query)
- parseSqlExp' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError SExp)
- parseSqlStatements' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError [Statement])
- parseSqlQuery :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r Query
- parseSqlExp :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r SExp
- parseStatements :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => SourceLocation -> Text -> Sem r [a]
- overrideDialect :: forall (r :: EffectRow) a. Member (Reader SQLDialect) r => SQLDialect -> Sem r a -> Sem r a
- data ExtendedStatement = ExtendedStatement {
- ddl :: CreateTableDDL
- inserts :: [InsertStatement]
- insertStatementToQuery :: InsertStatement -> ([Text], Query)
- parseExtendedStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r ExtendedStatement
- data SqlWrite b (m :: k) a where
- CreateTableAsWithMeta :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> Query -> SqlWrite b m ()
- CreateViewAsWithMeta :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> SqlWrite b m ()
- CreateMaterializedViewAsWithMeta :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> SqlWrite b m ()
- InsertInto :: forall {k} b (m :: k). Ref Table -> InsertColumnsList -> Query -> SqlWrite b m ()
- UpdateTable :: forall {k} b (m :: k). UpdateQuery -> SqlWrite b m ()
- RenameTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> SqlWrite b m ()
- CopyTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> TableWriteStrategy -> SqlWrite b m ()
- DropTable :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m ()
- DropView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m ()
- DropMaterializedView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m ()
- DeleteFrom :: forall {k} b (m :: k). Ref Table -> SExp -> SqlWrite b m ()
- CreateTable :: forall {k} b (m :: k). BackendTableMeta b -> CreateTableDDL -> SqlWrite b m ()
- DropColumn :: forall {k} b (m :: k). Ref Table -> Text -> SqlWrite b m ()
- AddColumn :: forall {k} b (m :: k). Ref Table -> Text -> Type -> SqlWrite b m ()
- data InsertColumnsList
- type ColName = Text
- data MissingBehavior
- data Cascade
- data TableWriteStrategy
- type family BackendMaterializedViewMeta bk
- type family BackendViewMeta bk
- type family BackendTableMeta bk
- type family BackendMeta (k :: TableKind) bk where ...
- createTableAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> Query -> Sem r ()
- createViewAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r ()
- createMaterializedViewAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendMaterializedViewMeta b -> Ref Table -> Query -> Sem r ()
- insertInto :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> InsertColumnsList -> Query -> Sem r ()
- updateTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => UpdateQuery -> Sem r ()
- copyTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> TableWriteStrategy -> Sem r ()
- dropTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r ()
- dropMaterializedView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r ()
- deleteFrom :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> SExp -> Sem r ()
- createTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> CreateTableDDL -> Sem r ()
- dropColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r ()
- addColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Type -> Sem r ()
- createTableAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r ()
- createTableIfNotExistAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r ()
- createViewAs :: forall b (r :: EffectRow). (Default (BackendViewMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r ()
- createMaterializedViewAs :: forall b (r :: EffectRow). (Default (BackendMaterializedViewMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r ()
- insertIntoQuery :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Query -> Sem r ()
- data LoadQuery (m :: k) a where
- LoadQueryFromFile :: forall {k} (m :: k). FilePath -> SqlTemplateVariables -> LoadQuery m (Either LoadQueryError Text)
- LoadQueryInline :: forall {k} (m :: k). SourceLocation -> Text -> SqlTemplateVariables -> LoadQuery m (Either LoadQueryError Text)
- newtype LoadQueryError = LoadQueryError Text
- data LoadQueryCacheKey
- loadQueryFromFile :: forall (r :: EffectRow). Member (LoadQuery :: (Type -> Type) -> Type -> Type) r => FilePath -> SqlTemplateVariables -> Sem r (Either LoadQueryError Text)
- loadQueryInline :: forall (r :: EffectRow). Member (LoadQuery :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> SqlTemplateVariables -> Sem r (Either LoadQueryError Text)
- loadInline :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> Text -> SqlTemplateVariables -> Sem r a
- loadSqlFile :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Sem r Query
- loadSqlFiles :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => NonEmpty FilePath -> SqlTemplateVariables -> Sem r (NonEmpty Query)
- loadInlineSql :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Text -> SqlTemplateVariables -> Sem r Query
- loadInlineStatement :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => Text -> SqlTemplateVariables -> Sem r [a]
- loadStatementFile :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => FilePath -> SqlTemplateVariables -> Sem r [a]
- optionalArg :: SpecProgramArgumentDescription -> SpecProgramArgumentDefinition
- requiredArg :: SpecProgramArgumentDescription -> SpecProgramArgumentDefinition
- requiredArgDef :: ToJSON a => a -> SpecProgramArgumentDescription -> SpecProgramArgumentDefinition
- announceMetaArguments :: SpecProgramArguments -> b -> (SpecProgramArguments, b)
- noMetaArguments :: b -> (SpecProgramArguments, b)
- data BackendFunctionMeta = BackendFunctionMeta {}
- type SExp_ (a :: Symbol) = SExp
- (||.) :: SExp -> SExp -> SExp
- concatPortable :: [SExp] -> SExp
- avg :: SExp -> SExp
- countd :: SExp -> SExp
- nullary :: Ref Function -> SExp
- unary :: Ref Function -> SExp -> SExp
- triple :: Ref Function -> SExp -> SExp -> SExp -> SExp
- quaternary :: Ref Function -> SExp -> SExp -> SExp -> SExp -> SExp
- raw :: Text -> SExp
- true :: SExp
- false :: SExp
- multiple_12 :: Ref Function -> SExp -> Maybe SExp -> SExp
- simpleWindow :: Ref Function -> [SExp] -> WOver -> Maybe NullStrategy -> SExp
- modExtern :: Ref Function -> [SExp] -> [FunModifier] -> SExp
- case_ :: [(SExp, SExp)] -> SExp -> SExp
- caseMatch_ :: SExp -> [(SExp, SExp)] -> SExp -> SExp
- asText :: SExp -> SExp
- asDouble :: SExp -> SExp
- asDate :: SExp -> SExp
- asTimestamp :: SExp -> SExp
- (==.) :: SExp -> SExp -> SExp
- (/=.) :: SExp -> SExp -> SExp
- (>=.) :: SExp -> SExp -> SExp
- (>.) :: SExp -> SExp -> SExp
- (<=.) :: SExp -> SExp -> SExp
- isNot :: SExp -> SExp -> SExp
- isNull :: SExp -> SExp
- exists :: Query -> SExp
- notExists :: Query -> SExp
- in_ :: SExp -> [SExp] -> SExp
- notIn :: SExp -> [SExp] -> SExp
- always :: SExp
- any_ :: SExp -> SExp
- all_ :: SExp -> SExp
- some_ :: SExp -> SExp
- maxOf :: SExp -> SExp -> SExp
- minOf :: SExp -> SExp -> SExp
- hardCount :: SExp
- valueIf :: SExp -> SExp -> SExp -> SExp
- nullifyUnless :: SExp -> SExp -> SExp
- nullifyIf :: SExp -> SExp -> SExp
- nullifyIfEmpty :: SExp -> SExp
- deepApply :: (SExp -> SExp) -> SExp -> SExp
- notEmpty :: SExp -> SExp
- countTrue :: SExp -> SExp
- boolToInt :: SExp -> SExp
- coalesce :: [SExp] -> SExp
- inferAggGeneric :: BackendFunctionMeta -> SExp -> AggLevel
- unitBoundaryGeneric :: BackendFunctionMeta -> SExp -> [SExp]
- modifyUnitBoundaryGeneric :: BackendFunctionMeta -> (SExp -> SExp) -> SExp -> SExp
- newtype U a = U {}
- runQ :: Q a -> (a, Query)
- class HasRefStore s where
- data RefStore = RefStore {}
- letters :: [Char]
- newRefStore :: RefStore
- newRef :: forall {k} s m (a :: k). (HasRefStore s, MonadState s m) => m (Ref a)
- newQState :: QState
- mkQ :: Q a -> Query
- evalQ :: Q c -> c
- modQ :: Query -> Q a -> Query
- asQuery :: Iso' (Q ()) Query
- with_ :: Query -> Q (Ref Relation)
- withQ_ :: Q a -> Q (Ref Relation)
- withQ'_ :: Q a -> Q (Ref Relation, Query)
- withQ :: Q a -> Q (Ref Relation, Query, a)
- withQAs_ :: Ref Query -> Q a -> Q (Ref Table)
- withAs_ :: Selected Query -> Q (Ref Table)
- withAs_' :: Selected Query -> NonEmpty (Ref SExp) -> Q (Ref Table)
- withOptionAs_ :: Bool -> Maybe (NonEmpty (Ref SExp)) -> Selected Query -> Q (Ref Table)
- withRecursiveAs_ :: Selected Query -> Q (Ref Table)
- withAsUnique :: Selected Query -> Q (Ref Table)
- select_ :: SExp -> Q (Ref SExp)
- selectAs_ :: Selected SExp -> Q (Ref SExp)
- selectsAs_ :: [Selected SExp] -> Q [Ref SExp]
- selectAs_' :: Alias SExp -> Q (Maybe (Ref SExp))
- selectsAs_' :: [Alias SExp] -> Q [Maybe (Ref SExp)]
- addComment :: Text -> Ref SExp -> Q (Ref SExp)
- annotateJson :: ToJSON a => a -> Ref SExp -> Q (Ref SExp)
- selectsGroupsAs_ :: [Selected SExp] -> Q ()
- selectsGroupsAsRef_ :: [Selected SExp] -> Q ()
- selectNonEmptyGroups :: [Selected SExp] -> Q ()
- from_ :: Relation -> Q (Ref Relation)
- fromIfNecessary :: Relation -> Q (Ref Relation)
- fromSelected_ :: Selected Relation -> Q (Ref Relation)
- fromAlias_ :: Alias Relation -> Q (Ref Relation)
- fromRef_ :: Ref Relation -> Q (Ref Relation)
- fromRel :: AsRelation r => r -> Q (Ref Relation)
- fromSpecified :: Q Bool
- fromOrJoin :: Alias Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation)
- join_ :: JoinType -> Relation -> (Ref Relation -> Maybe SExp) -> Q (Ref Relation)
- joinUsing_ :: JoinType -> Relation -> [Ref SExp] -> Q (Ref Relation)
- joinRef_ :: JoinType -> Ref Relation -> (Ref Relation -> Maybe SExp) -> Q (Ref Relation)
- joinSelected_ :: JoinType -> Selected Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation)
- joinAlias_ :: JoinType -> Alias Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation)
- joinOn_ :: JoinType -> Relation -> (Ref Relation -> SExp) -> Q (Ref Relation)
- innerJoin :: Relation -> (Ref Relation -> SExp) -> Q (Ref Relation)
- crossJoin :: Relation -> Q (Ref Relation)
- leftJoin :: Relation -> (Ref Relation -> SExp) -> Q (Ref Relation)
- rightJoin :: Relation -> (Ref Relation -> SExp) -> Q (Ref Relation)
- outerJoin :: Relation -> (Ref Relation -> SExp) -> Q (Ref Relation)
- having :: MonadState QState m => SExp -> m ()
- havingL :: Applicative f => (Maybe SExp -> f (Maybe SExp)) -> QState -> f QState
- where_ :: SExp -> Q ()
- whereL :: (Maybe SExp -> Identity (Maybe SExp)) -> QState -> Identity QState
- tableOperator_ :: ParensOperator -> Q ()
- tableOperatorL :: (Maybe ParensOperator -> Identity (Maybe ParensOperator)) -> QState -> Identity QState
- whereAdd :: MonadState QState m => SExp -> m ()
- whereAddIn :: MonadState QState m => SExp -> [SExp] -> m ()
- whereAddNotIn :: MonadState QState m => SExp -> [SExp] -> m ()
- groupBy_ :: [SExp] -> Q ()
- orderBy_ :: Order -> Q ()
- limit_ :: MonadState QState m => Int -> m ()
- offset_ :: MonadState QState m => Int -> m ()
- mdef :: a -> Iso' (Maybe a) a
- fromQuery :: Q a -> Relation
- scopeRelation :: SExp -> Relation -> Relation
- selectEverything :: [(Ref Relation, DefinedQuery)] -> Q ()
- explicitSelectStarWith :: s -> Ref Relation -> Getting (Endo [Ref SExp]) s (Ref SExp) -> (Selected SExp -> Selected SExp) -> Q ()
- explicitSelectStar :: HasDefinition s => s -> Ref Relation -> Q ()
- explicitMapSelectStar :: HasDefinition s => s -> Ref Relation -> (Selected SExp -> Selected SExp) -> Q ()
- selectStar :: Ref Relation -> Q (Ref Relation)
- selectNonDuplicates :: Foldable t => t (Ref SExp) -> Q ()
- mapSelectNonDuplicates :: Foldable t => t (Ref SExp) -> (Selected SExp -> Selected SExp) -> Q ()
- union_ :: UnionType -> Query -> Query -> WithClauses -> Q ()
- mkU :: Alias (Ref Table) -> (Ref Relation -> U a) -> UpdateQuery
- updateWhereAdd :: MonadState UState m => SExp -> m ()
- updateJoin_ :: JoinType -> Relation -> (Ref Relation -> Maybe SExp) -> U (Ref Relation)
- updateJoinOn_ :: JoinType -> Relation -> (Ref Relation -> SExp) -> U (Ref Relation)
- updateInnerJoin_ :: Relation -> (Ref Relation -> SExp) -> U (Ref Relation)
- updateSet_ :: Name -> SExp -> U ()
- qsQuery :: Lens' QState Query
- qsVars :: Lens' UState RefStore
- newtype TableMemos = TableMemos (Map SpecTableName TableMemo)
- newtype TableMemo = TableMemo [Value]
- newtype Transformed a = Transformed a
- newtype MetaArguments = MetaArguments {}
- newtype TargetName = TargetName (Ref Table)
- newtype HiddenArtifacts = HiddenArtifacts (Set (Ref Table))
- newtype HiddenDependencies = HiddenDependencies (Set (Ref Table))
- newtype ExtraDependencies = ExtraDependencies (Set (Ref Table))
- renameReferences :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => (Ref Table -> Ref Table) -> Sem r a -> Sem r a
- applyTransformer :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => QueryTransformerUnit -> Sem r a -> Sem r a
- hideDependencies :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Set (Ref Table) -> Sem r a -> Sem r a
- hideDependency :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Ref Table -> Sem r a -> Sem r a
- hideArtifact :: forall a (r :: EffectRow). Member (Reader HiddenArtifacts) r => Ref Table -> Sem r a -> Sem r a
- addDependencies :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Set (Ref Table) -> Sem r ()
- overrideTarget :: forall a (r :: EffectRow). Member (Reader TargetName) r => Ref Table -> Sem r a -> Sem r a
- insertQueryIntoTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Query -> Sem effs ()
- deleteFromTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => SExp -> Sem effs ()
- updateTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => (Ref Relation -> U ()) -> Sem effs ()
- memo :: forall a (eff :: EffectRow). (Member (Output TableMemo :: (Type -> Type) -> Type -> Type) eff, ToJSON a) => a -> Sem eff ()
- data RecreateTable b (m :: k) a where
- RecreateTableAs :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> NonEmpty Query -> RecreateTable b m ()
- RecreateViewAs :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> RecreateTable b m ()
- RecreateMaterializedViewAs :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> RecreateTable b m ()
- RecreateTableStatement' :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> CreateTableDDL -> [InsertStatement] -> RecreateTable b m ()
- recreateTableAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> NonEmpty Query -> Sem r ()
- recreateViewAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r ()
- recreateMaterializedViewAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendMaterializedViewMeta b -> Ref Table -> Query -> Sem r ()
- recreateTableStatement' :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> CreateTableDDL -> [InsertStatement] -> Sem r ()
- recreateTargetTable :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendTableMeta b -> NonEmpty Query -> Sem effs ()
- recreateTableStatement :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendTableMeta b -> CreateTableDDL -> [InsertStatement] -> Sem effs ()
- recreateTargetView :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendViewMeta b -> Query -> Sem effs ()
- recreateTargetMaterializedView :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendMaterializedViewMeta b -> Query -> Sem effs ()
- data AnnotateRead (b :: k) (m :: k1) a where
- GetAnnotations :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> AnnotateRead b m TableAnnotations
- type ColumnsAnnotations = Map (Ref SExp) Text
- data TableAnnotations = TableAnnotations {}
- getTargetAnnotations :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateRead b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Sem effs TableAnnotations
- data AnnotateWrite (b :: k) (m :: k1) a where
- AnnotateTable :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Text -> AnnotateWrite b m ()
- AnnotateColumns :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> ColumnsAnnotations -> AnnotateWrite b m ()
- data AnnotateDescription
- data AnnotateTableOrView = AnnotateTableOrView {}
- commandTypeToDescriptions :: Annotation -> [AnnotateDescription]
- annotateTable :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r ()
- annotateColumns :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> ColumnsAnnotations -> Sem r ()
- annotateColumn :: forall {k} (b :: k) (effs :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) effs => Ref Table -> Ref SExp -> Text -> Sem effs ()
- annotateTargetTable :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Text -> Sem effs ()
- annotateTargetColumns :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => ColumnsAnnotations -> Sem effs ()
- annotateTargetColumn :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Ref SExp -> Text -> Sem effs ()
- askTextArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Text -> Sem r Text
- askTextArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Text
- askTextArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Text)
- askBoolArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Bool -> Text -> Sem r Bool
- askBoolArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Bool
- askBoolArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Bool)
- askNumArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Scientific -> Text -> Sem r Scientific
- askNumArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Scientific
- askNumArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Scientific)
- askArg :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r a
- askArgMb :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r (Maybe a)
- withTypedArg :: forall a b (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Typeable a) => (a -> Sem r b) -> Sem r b
- unpackRenderedSql :: RenderedSql -> Text
- sqlToFile :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> FilePath -> IO ()
- sqlToFileCollapsed :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> FilePath -> IO ()
- printSql :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> IO ()
- class HasBackendQueryStats b => LocalQueryStats (b :: k) (m :: Type -> Type) where
- tellStats :: QueryStats b -> m ()
- type MonadNapkin (b :: k) (m :: Type -> Type) = (Monad m, BackendDialect b, Katip m, MonadUnliftIO m, LocalQueryStats b m, RenderSql Query b)
- type ConnectionString = Text
- discardQueryStats :: Katip m => KatipT IO a -> m a
- newtype AuthSpecFile = AuthSpecFile {}
- type SpecMetaArgs = Map Text Value
- newtype BkStatistics = BkStatistics Value
- data SpecPaths = SpecPaths {}
- newtype AppName = AppName Text
- data SpecDepsAndQueries (bk :: k) = SpecDepsAndQueries {}
- type ProgramAndHooksDependenciesAndQueries (bk :: k) = (ProgramDependenciesAndQueries bk, [DryRunResult bk], [DryRunResult bk])
- data DryRunResult (b :: k) = DryRunResult {
- dependencies :: Dependencies
- artifacts :: Artifacts
- queries :: [DumpItem b]
- loadedSqlQueries :: [(FilePath, Query)]
- assertions :: AssertionLog
- data ProgramDependenciesAndQueries (b :: k)
- = SinglePath (DryRunResult b)
- | MultiplePaths {
- createPath :: DryRunResult b
- updatePath :: DryRunResult b
- class RunBackendEffect b where
- runBackendEffectReal :: forall (m :: Type -> Type) (r :: EffectRow) a. (LocalQueryStats b m, Members '[FatalError :: (Type -> Type) -> Type -> Type, Embed m] r, MonadNapkin b m, SqlIO m) => BackendConn b -> Sem (BackendSpecificEffect b ': r) a -> Sem r a
- runBackendEffectFake :: forall (r :: EffectRow) a. Members '[Reader HiddenDependencies, State IState :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Sem (BackendSpecificEffect b ': r) a -> Sem r a
- interceptBackendEffectDiscoverDependencies :: forall (r :: EffectRow) a. Members '[Input (Transformed HiddenDependencies) :: (Type -> Type) -> Type -> Type, Output Dependencies :: (Type -> Type) -> Type -> Type, BackendSpecificEffect b] r => Sem r a -> Sem r a
- interceptBackendEffectApplyQueryTransformer :: forall (r :: EffectRow) a. Members '[Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader QueryTransformer, BackendSpecificEffect b] r => Sem r a -> Sem r a
- backendDependencyValidator :: Proxy b -> [(SpecDependency -> Ref Table) -> SpecsDepsTables -> [WithSpecTable Text]]
- type Core b = '[FatalError :: (Type -> Type) -> Type -> Type, Input RandomToken :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Output LogLine :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, BackendSpecificEffect b, AnnotateRead b :: (Type -> Type) -> Type -> Type, AnnotateWrite b :: (Type -> Type) -> Type -> Type, LocalFile :: (Type -> Type) -> Type -> Type, Template :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, Reader QueryTransformer, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader HiddenArtifacts, Input MetaArguments :: (Type -> Type) -> Type -> Type, Reader SQLDialect, Reader ConnectionString, Fail :: (Type -> Type) -> Type -> Type]
- type TableEffects b = '[Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Output TableMemo :: (Type -> Type) -> Type -> Type] ++ Core b
- type AssertionEffects (b :: k1) = '[Assertion :: k -> Type -> Type]
- type IOGlobalHookProgramEffects b = '[Embed IO] ++ PureGlobalHookProgramEffects b
- type PureGlobalHookProgramEffects b = '[External :: (Type -> Type) -> Type -> Type, Reader TableMemos, Output TableMemo :: (Type -> Type) -> Type -> Type] ++ ((AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ Core b)
- type TableHookProgramEffects b = (AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ TableEffects b
- type SpecProgramEffects b = (AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ TableEffects b
- newtype SpecProgramWithArgParser b = SpecProgramWithArgParser (Object -> Parser (SpecProgramArguments, SpecProgram b))
- newtype HookProgramWithArgParser b = HookProgramWithArgParser (Object -> Parser (SpecProgramArguments, HookProgram b))
- type SpecProgram b = SpecProgram' b ()
- type PureGlobalHookProgram b = PureGlobalHookProgram' b ()
- type PureGlobalHookProgram' b a = Sem (PureGlobalHookProgramEffects b) a
- type IOGlobalHookProgram b = IOGlobalHookProgram' b ()
- type IOGlobalHookProgram' b a = Sem (IOGlobalHookProgramEffects b) a
- data HookSyncOrAsync
- type HookProgram b = HookProgram' b ()
- type HookProgram' b a = Sem (TableHookProgramEffects b) a
- type SpecProgram' b a = Sem (SpecProgramEffects b) a
- pattern SyncHook :: HookProgram b -> Hook b
- pattern AsyncHook :: HookProgram b -> Hook b
- parserlessHook :: HookProgram b -> HookProgramWithArgParser b
- parserlessSpec :: SpecProgram b -> SpecProgramWithArgParser b
- askRefRenamer :: forall (r :: EffectRow). Member (Reader QueryTransformer) r => Sem r (Ref Table -> Ref Table)
- askQueryRewriter :: forall (r :: EffectRow). Member (Reader QueryTransformer) r => Sem r (Query -> Query)
- askQueryRewriterData :: forall a (r :: EffectRow). (Data a, Member (Reader QueryTransformer) r) => Sem r (a -> a)
- summarizeWithHooks :: forall {k} (b :: k). ProgramAndHooksDependenciesAndQueries b -> DryRunResult b
- summarize :: forall {k} (b :: k). ProgramDependenciesAndQueries b -> DryRunResult b
- type SpecPreprocessorFunc bk = SpecMetaArgs -> Specs bk -> Specs bk
- type SpecPreprocessor b = Sem '[Input SpecPaths :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, State (Specs b) :: (Type -> Type) -> Type -> Type, Output DepsValidator :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Embed IO, Log :: (Type -> Type) -> Type -> Type] ()
- type DepsValidator = (SpecDependency -> Ref Table) -> SpecsDepsTables -> [WithSpecTable Text]
- newtype SpecPreprocessorWithArgParser b = SpecPreprocessorWithArgParser (Object -> Parser (SpecProgramArguments, SpecPreprocessor b))
- newtype CustomValidator = CustomValidator {
- unCustomValidator :: SpecMetaArgs -> Ref Table -> Maybe FilePath -> Query -> [Text]
- newtype Spec b a = Spec {}
- type GlobalHooks b = Map Text ([SpecTableName], SpecGlobalHook b)
- data SpecGlobalHook b
- type SpecTableMap b = Map SpecTableName (TableSpec b)
- data UpdateStrategy
- type TableSpecTag = Text
- data SpecTarget b
- parserlessPreprocessor :: SpecPreprocessor b -> SpecPreprocessorWithArgParser b
- toRef :: SpecDependency -> Ref Table
- allTasksInSpecsDeps :: SpecsDepsTables -> Set (WithSpecTable SpecDependency)
- allUnmanagedTasksInSpec :: SpecsDepsTables -> Set (WithSpecTable (Ref Table))
- runSpec :: SpecPaths -> Spec b a -> IO (Specs b)
- runSpecE :: SpecPaths -> ExceptT e (Spec b) a -> IO (Either e (Specs b))
- runSpecE' :: SpecPaths -> Specs b -> ExceptT e (Spec b) a -> IO (Either e (a, Specs b))
- specAddPreHooks :: [HookProgram b] -> TableSpec b -> TableSpec b
- specAddPostHooks :: [HookProgram b] -> TableSpec b -> TableSpec b
- specAddAsyncPreHooks :: [HookProgram b] -> TableSpec b -> TableSpec b
- specAddAsyncPostHooks :: [HookProgram b] -> TableSpec b -> TableSpec b
- allSpecsTables :: Specs b -> Set SpecTableName
- defineTable :: TableSpec b -> Spec b ()
- specTable :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> TableSpec b -> f (TableSpec b)
- specAction :: forall b f. Functor f => (SpecProgram b -> f (SpecProgram b)) -> TableSpec b -> f (TableSpec b)
- specUpdate :: forall b f. Functor f => ([UpdateStrategy] -> f [UpdateStrategy]) -> TableSpec b -> f (TableSpec b)
- specTags :: forall b f. Functor f => (Set TableSpecTag -> f (Set TableSpecTag)) -> TableSpec b -> f (TableSpec b)
- specsTables :: forall b f. Functor f => (SpecTableMap b -> f (SpecTableMap b)) -> Specs b -> f (Specs b)
- specsHooks :: forall b f. Functor f => (GlobalHooks b -> f (GlobalHooks b)) -> Specs b -> f (Specs b)
- specsMetaArgs :: forall b f. Functor f => (SpecMetaArgs -> f SpecMetaArgs) -> Specs b -> f (Specs b)
- specsTransformer :: forall b f. Functor f => (QueryTransformer -> f QueryTransformer) -> Specs b -> f (Specs b)
- specTagRefMap :: [TableSpec b] -> Map (Maybe TableSpecTag) [SpecTableName]
- specListTags :: forall bk m. MonadIO m => Specs bk -> m ()
- showText :: Show a => a -> Text
- calendarDay :: CalendarDiffDays
- calendarMonth :: CalendarDiffDays
- calendarWeek :: CalendarDiffDays
- calendarYear :: CalendarDiffDays
- scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays
- addDays :: Integer -> Day -> Day
- diffDays :: Day -> Day -> Integer
- periodAllDays :: DayPeriod p => p -> [Day]
- periodFromDay :: DayPeriod p => Day -> (p, Int)
- periodLength :: DayPeriod p => p -> Int
- periodToDay :: DayPeriod p => p -> Int -> Day
- periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day
- pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day
- addGregorianDurationClip :: CalendarDiffDays -> Day -> Day
- addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day
- addGregorianMonthsClip :: Integer -> Day -> Day
- addGregorianMonthsRollOver :: Integer -> Day -> Day
- addGregorianYearsClip :: Integer -> Day -> Day
- addGregorianYearsRollOver :: Integer -> Day -> Day
- diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays
- diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays
- fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day
- fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day
- gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth
- showGregorian :: Day -> String
- toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth)
- pattern BeforeCommonEra :: Integer -> Year
- pattern CommonEra :: Integer -> Year
- dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int
- firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day
- weekAllDays :: DayOfWeek -> Day -> [Day]
- weekFirstDay :: DayOfWeek -> Day -> Day
- weekLastDay :: DayOfWeek -> Day -> Day
- diffTimeToPicoseconds :: DiffTime -> Integer
- picosecondsToDiffTime :: Integer -> DiffTime
- secondsToDiffTime :: Integer -> DiffTime
- nominalDay :: NominalDiffTime
- nominalDiffTimeToSeconds :: NominalDiffTime -> Pico
- secondsToNominalDiffTime :: Pico -> NominalDiffTime
- getTime_resolution :: DiffTime
- addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime
- diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime
- formatTime :: FormatTime t => TimeLocale -> String -> t -> String
- defaultTimeLocale :: TimeLocale
- iso8601DateFormat :: Maybe String -> String
- rfc822DateFormat :: String
- parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t
- parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t
- parseTimeOrError :: ParseTime t => Bool -> TimeLocale -> String -> String -> t
- readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t
- readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t
- calendarTimeDays :: CalendarDiffDays -> CalendarDiffTime
- calendarTimeTime :: NominalDiffTime -> CalendarDiffTime
- scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime
- addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime
- diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime
- localTimeToUT1 :: Rational -> LocalTime -> UniversalTime
- localTimeToUTC :: TimeZone -> LocalTime -> UTCTime
- ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime
- utcToLocalTime :: TimeZone -> UTCTime -> LocalTime
- dayFractionToTimeOfDay :: Rational -> TimeOfDay
- daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime
- localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay
- midday :: TimeOfDay
- midnight :: TimeOfDay
- pastMidnight :: DiffTime -> TimeOfDay
- sinceMidnight :: TimeOfDay -> DiffTime
- timeOfDayToDayFraction :: TimeOfDay -> Rational
- timeOfDayToTime :: TimeOfDay -> DiffTime
- timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay)
- timeToTimeOfDay :: DiffTime -> TimeOfDay
- utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- getCurrentTimeZone :: IO TimeZone
- getTimeZone :: UTCTime -> IO TimeZone
- hoursToTimeZone :: Int -> TimeZone
- minutesToTimeZone :: Int -> TimeZone
- timeZoneOffsetString :: TimeZone -> String
- timeZoneOffsetString' :: Maybe Char -> TimeZone -> String
- utc :: TimeZone
- getZonedTime :: IO ZonedTime
- utcToLocalZonedTime :: UTCTime -> IO ZonedTime
- utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime
- zonedTimeToUTC :: ZonedTime -> UTCTime
- data CalendarDiffDays = CalendarDiffDays {}
- class Ord p => DayPeriod p where
- periodFirstDay :: p -> Day
- periodLastDay :: p -> Day
- dayPeriod :: Day -> p
- type DayOfMonth = Int
- type MonthOfYear = Int
- newtype UniversalTime = ModJulianDate {}
- class FormatTime t
- class ParseTime t
- data CalendarDiffTime = CalendarDiffTime {}
- data TimeZone = TimeZone {}
- data ZonedTime = ZonedTime {}
- assertNotNull :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [SExp] -> Sem r ()
- data CountTolerance
- data WithinSet a
- = FromToRange a a
- | ValuesList [a]
- pattern ApproxEqualRelative :: Scientific -> CompareCount
- pattern ApproxEqualAbsolute :: Scientific -> CompareCount
- assertAllValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r ()
- assertAllValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r ()
- assertAnswerConst :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> a -> Sem r ()
- assertAnswerConstT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Real a, Show a, Val a) => CompareCount -> Q q -> a -> Sem r ()
- assertAnswerEq :: forall {k} a (b :: k) (r :: EffectRow). (Eq a, GlobalAssert b r, Show a, Val a) => Query -> a -> Sem r ()
- assertAnswerEqT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Eq a, Show a, Val a) => Q q -> a -> Sem r ()
- assertAnswers :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> Query -> Sem r ()
- assertAnyPresent :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => SExp -> Relation -> Sem r ()
- assertAnyPresentT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r ()
- assertAnyValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r ()
- assertAnyValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r ()
- assertCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> Relation -> SExp -> Sem r ()
- assertCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> Relation -> SExp -> Sem r ()
- assertCount :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Relation -> Sem r ()
- assertCountConst :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Integer -> Sem r ()
- assertCountConstT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Integer -> Sem r ()
- assertCountT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Relation -> Sem r ()
- assertExpression :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> SExp -> Sem r ()
- assertExpressionT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r ()
- assertNotNullT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [SExp] -> Sem r ()
- assertNoValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r ()
- assertNoValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r ()
- assertUniqueBy :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [Selected SExp] -> Sem r ()
- assertUniqueByCap :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CountTolerance -> Relation -> [Selected SExp] -> Sem r ()
- assertUniqueByCapT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CountTolerance -> [Selected SExp] -> Sem r ()
- assertUniqueByT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [Selected SExp] -> Sem r ()
- assertUniqueByWhere :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> PredicateSExp -> [Selected SExp] -> Sem r ()
- assertUniqueByWhereT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => PredicateSExp -> [Selected SExp] -> Sem r ()
- assertMultipleCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> [(Relation, SExp)] -> Sem r ()
- assertMultipleCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> [(Relation, SExp)] -> Sem r ()
- assertMultipleColumnsCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> [Selected SExp] -> Relation -> [Selected SExp] -> Sem r ()
- splitIfUnionBy :: forall b (r :: EffectRow) a. Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, RecreateTable b :: (Type -> Type) -> Type -> Type] r => Int -> Sem r a -> Sem r a
- incrementalInsertByPK :: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, RecreateTable b :: (Type -> Type) -> Type -> Type] r => (Day -> Sem r Query) -> SExp -> Day -> Integer -> BackendTableMeta b -> Sem r ()
- incrementalByTimeRawSql :: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => FilePath -> SqlTemplateVariables -> [ColumnName] -> SExp -> Day -> Integer -> BackendTableMeta b -> Sem r ()
- incrementalByTimeCreateAction :: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader TargetName, Input MetaArguments :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => [ColumnName] -> (Day -> Sem r Query) -> Day -> (Day -> SExp) -> Integer -> BackendTableMeta b -> Sem r ()
- loadSqlFileWithCutoff :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Day -> Sem r Query
- copyData :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => CopySource -> CopyDestination -> Sem r ()
- copyData' :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => InsertColumnsList -> CopySource -> CopyDestination -> Sem r ()
- longToWideAuto :: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type] r => Ref Table -> (SExp -> SExp) -> [Alias SExp] -> SExp -> SExp -> (Value -> Ref SExp) -> SpecTarget b -> Sem r ()
- combineTables :: forall b (r :: EffectRow). (HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader QueryTransformer] r) => SpecTarget b -> (Query -> Query) -> [Relation] -> Sem r ()
- createRawSql :: forall b (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader QueryTransformer, RecreateTable b :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> ExtraDependencies -> HiddenDependencies -> SpecTarget b -> Sem r ()
- createWithQuery :: forall b (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader QueryTransformer, RecreateTable b :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type] r => NonEmpty Query -> SpecTarget b -> ExtraDependencies -> HiddenDependencies -> Sem r ()
- recreateTarget :: forall b (r :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName, SqlWrite b :: (Type -> Type) -> Type -> Type] r => SpecTarget b -> NonEmpty Query -> Sem r ()
- pattern IncrementalReset :: (Eq a, IsString a) => a
- enforceSchema :: forall b (r :: EffectRow). (Eq (BackendSchemaField b), HasBackendSchemaField b, Members '[Input TemporaryTableName :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => SchemaMigrationOptions -> Ref Table -> [BackendSchemaField b] -> Sem r ()
- data SchemaMigrationOptions = SchemaMigrationOptions {}
- forbidSchemaMigrationOptions :: SchemaMigrationOptions
- askSchemaMigrationOptions :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Ref Table -> Sem r SchemaMigrationOptions
- data AddedColumnPolicy
- data DroppedColumnPolicy
- mkDefaultPolicy :: a -> ColumnPolicy a
- data ColumnPolicy a = ColumnPolicy {
- defaultPolicy :: a
- columnOverrides :: Map Text a
- pattern AddColumnsList :: (Eq a, IsString a) => a
- pattern AddColumnsPolicy :: (Eq a, IsString a) => a
- pattern DropColumnsList :: (Eq a, IsString a) => a
- pattern DropColumnsPolicy :: (Eq a, IsString a) => a
- spec :: SpecTableName -> TableSpec b
- ctaMeta :: forall b f. Functor f => (BackendTableMeta b -> f (BackendTableMeta b)) -> CreateTableAs b -> f (CreateTableAs b)
- ctaName :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> CreateTableAs b -> f (CreateTableAs b)
- ctaQuery :: forall b f. Functor f => (Query -> f Query) -> CreateTableAs b -> f (CreateTableAs b)
- ctaToSpec :: CreateTableAs b -> TableSpec b
- tableWithQueryAndMeta :: BackendTableMeta b -> SpecTableName -> Query -> TableSpec b
- tableWithQuery :: Default (BackendTableMeta b) => SpecTableName -> Query -> TableSpec b
- programToSpec :: SpecTableName -> SpecProgram b -> TableSpec b
- viewWithQuery :: Default (BackendViewMeta b) => SpecTableName -> Query -> TableSpec b
- specSplitIfUnion :: TableSpec b0 -> TableSpec b0
- specSplitIfUnionBy :: Int -> TableSpec b0 -> TableSpec b0
- specIncrementalByPK :: (Day -> CreateTableAs b) -> SExp -> Day -> Integer -> TableSpec b
- specIncrementalByTime :: (Default (BackendTableMeta b), HasBackendSchemaField b) => [Text] -> (Day -> CreateTableAs b) -> (Day -> SExp) -> Day -> Integer -> [Ref Table] -> TableSpec b
- specIncrementalByTimeRawSql :: (Default (BackendTableMeta b), HasBackendSchemaField b) => SpecTableName -> BackendTableMeta b -> [Ref Table] -> FilePath -> SqlTemplateVariables -> [Text] -> SExp -> Day -> Integer -> TableSpec b
- rawSqlSpec :: SpecTableName -> SpecTarget b -> FilePath -> [Ref Table] -> TableSpec b
- rawSqlMustacheSpec :: SpecTableName -> SpecTarget b -> FilePath -> SqlTemplateVariables -> [Ref Table] -> TableSpec b
- longToWideAutoSpec :: SpecTableName -> Ref Table -> (SExp -> SExp) -> [Alias SExp] -> SExp -> SExp -> (Value -> Ref SExp) -> SpecTarget b -> [Ref Table] -> TableSpec b
- commandSpec :: SpecTableName -> Text -> [Text] -> [Ref Table] -> TableSpec b
- shellSpec :: SpecTableName -> Text -> [Ref Table] -> TableSpec b
- combineTablesSpec :: HasBackendSchemaField b => SpecTableName -> SpecTarget b -> (Query -> Query) -> [Relation] -> TableSpec b
- addHooks :: [(Text, [SpecTableName], PureGlobalHookProgram b)] -> Spec b ()
- addHooks' :: [(Text, [SpecTableName], SpecGlobalHook b)] -> Spec b ()
- addIOHooks :: [(Text, [SpecTableName], IOGlobalHookProgram b)] -> Spec b ()
- addTags :: [TableSpecTag] -> Spec b a -> Spec b a
- withParsedMetaArg :: (FromJSON a, Typeable a) => (a -> Spec b c) -> Spec b c
- debugSql :: RenderSql a MsSql => a -> Unshow
Documentation
module Napkin.Run.MsSql
module Napkin.Types.MsSql
module Napkin.Untyped.Ops.MsSql
Constructors
Hook | |
Fields
|
Instances
Generic (Hook b) | |||||
Defined in Napkin.Run.Effects.Types Associated Types
| |||||
type Rep (Hook b) | |||||
Defined in Napkin.Run.Effects.Types type Rep (Hook b) = D1 ('MetaData "Hook" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Hook" 'PrefixI 'True) (S1 ('MetaSel ('Just "async") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 HookSyncOrAsync) :*: S1 ('MetaSel ('Just "hookProgram") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HookProgram b)))) |
class Applicative f => Alternative (f :: Type -> Type) where #
A monoid on applicative functors.
If defined, some
and many
should be the least solutions
of the equations:
Examples
>>>
Nothing <|> Just 42
Just 42
>>>
[1, 2] <|> [3, 4]
[1,2,3,4]
>>>
empty <|> print (2^15)
32768
Methods
The identity of <|>
empty <|> a == a a <|> empty == a
(<|>) :: f a -> f a -> f a infixl 3 #
An associative binary operation
One or more.
Examples
>>>
some (putStr "la")
lalalalalalalalala... * goes on forever *
>>>
some Nothing
nothing
>>>
take 5 <$> some (Just 1)
* hangs forever *
Note that this function can be used with Parsers based on
Applicatives. In that case some parser
will attempt to
parse parser
one or more times until it fails.
Zero or more.
Examples
>>>
many (putStr "la")
lalalalalalalalala... * goes on forever *
>>>
many Nothing
Just []
>>>
take 5 <$> many (Just 1)
* hangs forever *
Note that this function can be used with Parsers based on
Applicatives. In that case many parser
will attempt to
parse parser
zero or more times until it fails.
Instances
void :: Functor f => f a -> f () #
discards or ignores the result of evaluation, such
as the return value of an void
valueIO
action.
Examples
Replace the contents of a
with unit:Maybe
Int
>>>
void Nothing
Nothing
>>>
void (Just 3)
Just ()
Replace the contents of an
with unit, resulting in an Either
Int
Int
:Either
Int
()
>>>
void (Left 8675309)
Left 8675309
>>>
void (Right 8675309)
Right ()
Replace every element of a list with unit:
>>>
void [1,2,3]
[(),(),()]
Replace the second element of a pair with unit:
>>>
void (1,2)
(1,())
Discard the result of an IO
action:
>>>
mapM print [1,2]
1 2 [(),()]
>>>
void $ mapM print [1,2]
1 2
class MonadIO m => Katip (m :: Type -> Type) where #
Monads where katip logging actions can be performed. Katip is the most basic logging monad. You will typically use this directly if you either don't want to use namespaces/contexts heavily or if you want to pass in specific contexts and/or namespaces at each log site.
For something more powerful, look at the docs for KatipContext
,
which keeps a namespace and merged context. You can write simple
functions that add additional namespacing and merges additional
context on the fly.
localLogEnv
was added to allow for lexically-scoped modifications
of the log env that are reverted when the supplied monad
completes. katipNoLogging
, for example, uses this to temporarily
pause log outputs.
Instances
MonadIO m => Katip (KatipT m) | |
MonadIO m => Katip (KatipContextT m) | |
Defined in Katip.Monadic Methods getLogEnv :: KatipContextT m LogEnv # localLogEnv :: (LogEnv -> LogEnv) -> KatipContextT m a -> KatipContextT m a # | |
MonadIO m => Katip (NoLoggingT m) | |
Defined in Katip.Monadic Methods getLogEnv :: NoLoggingT m LogEnv # localLogEnv :: (LogEnv -> LogEnv) -> NoLoggingT m a -> NoLoggingT m a # | |
Katip m => Katip (ResourceT m) | |
Katip m => Katip (MaybeT m) | |
Katip m => Katip (ExceptT s m) | |
Katip m => Katip (ReaderT s m) | |
Katip m => Katip (StateT s m) | |
Katip m => Katip (StateT s m) | |
(Katip m, Monoid s) => Katip (WriterT s m) | |
(Katip m, Monoid s) => Katip (WriterT s m) | |
(Katip m, Monoid w) => Katip (RWST r w s m) | |
(Katip m, Monoid w) => Katip (RWST r w s m) | |
Verbosity controls the amount of information (columns) a Scribe
emits during logging.
The convention is:
- V0
implies no additional payload information is included in message.
- V3
implies the maximum amount of payload information.
- Anything in between is left to the discretion of the developer.
Instances
Constructors
TySmallInt | |
TyInteger | |
TyBigInt | |
TyDecimal | |
TyReal | |
TyDouble | |
TyBool | |
TyChar | |
TyVarChar | |
TyBlob | |
TyUnknown OriginTypeName | |
TyVarCharWithLen Int | |
TyDate | |
TyTimestamp | |
TyDatetime | |
TyInterval | |
TyLimited Type Int | |
Ty2DLimited Type Int Int | |
TyArray Type (Maybe Int) | |
TyStruct (OMap StructField Type) |
Instances
NFData Type | |||||
Defined in Napkin.Types.Core | |||||
Data Type | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type # dataTypeOf :: Type -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) # gmapT :: (forall b. Data b => b -> b) -> Type -> Type # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # | |||||
Generic Type | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Type | |||||
Eq Type | |||||
Ord Type | |||||
Lift Type | |||||
type Rep Type | |||||
Defined in Napkin.Types.Core type Rep Type = D1 ('MetaData "Type" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "TySmallInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyInteger" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyBigInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyDecimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyReal" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyDouble" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBool" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyVarChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBlob" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "TyUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OriginTypeName)) :+: C1 ('MetaCons "TyVarCharWithLen" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyDate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyTimestamp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyDatetime" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "Ty2DLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :+: C1 ('MetaCons "TyStruct" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField Type)))))))) |
data AssertionSeverity #
Instances
Show AssertionSeverity | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionSeverity -> ShowS # show :: AssertionSeverity -> String # showList :: [AssertionSeverity] -> ShowS # | |
Eq AssertionSeverity | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionSeverity -> AssertionSeverity -> Bool # (/=) :: AssertionSeverity -> AssertionSeverity -> Bool # |
Constructors
TableSpec | |
Fields
|
Instances
ToJSON (TableSpec b) | |||||
Generic (TableSpec b) | |||||
Defined in Napkin.Spec.Types.Spec Associated Types
| |||||
LogItem (TableSpec b) | |||||
Defined in Napkin.Spec.Types.Spec Methods payloadKeys :: Verbosity -> TableSpec b -> PayloadSelection # | |||||
ToObject (TableSpec b) | |||||
Defined in Napkin.Spec.Types.Spec | |||||
type Rep (TableSpec b) | |||||
Defined in Napkin.Spec.Types.Spec type Rep (TableSpec b) = D1 ('MetaData "TableSpec" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableSpec" 'PrefixI 'True) ((S1 ('MetaSel ('Just "table") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: (S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SpecProgram b)) :*: S1 ('MetaSel ('Just "preHooks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Hook b]))) :*: (S1 ('MetaSel ('Just "postHooks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Hook b]) :*: (S1 ('MetaSel ('Just "update") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UpdateStrategy]) :*: S1 ('MetaSel ('Just "tags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set TableSpecTag)))))) |
data CreateTableAs b #
Constructors
CreateTableAs | |
Fields
|
Instances
RenderSql Query a => RenderSql (CreateTableAs a) (a :: Type) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs | |||||
(Data (BackendTableMeta b), Data b, Typeable (BackendTableMeta b), Typeable b) => Data (CreateTableAs b) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> CreateTableAs b -> c (CreateTableAs b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CreateTableAs b) # toConstr :: CreateTableAs b -> Constr # dataTypeOf :: CreateTableAs b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CreateTableAs b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CreateTableAs b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> CreateTableAs b -> CreateTableAs b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CreateTableAs b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CreateTableAs b -> r # gmapQ :: (forall d. Data d => d -> u) -> CreateTableAs b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CreateTableAs b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) # | |||||
Generic (CreateTableAs b) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Associated Types
Methods from :: CreateTableAs b -> Rep (CreateTableAs b) x # to :: Rep (CreateTableAs b) x -> CreateTableAs b # | |||||
Show (BackendTableMeta b) => Show (CreateTableAs b) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods showsPrec :: Int -> CreateTableAs b -> ShowS # show :: CreateTableAs b -> String # showList :: [CreateTableAs b] -> ShowS # | |||||
Eq (BackendTableMeta b) => Eq (CreateTableAs b) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods (==) :: CreateTableAs b -> CreateTableAs b -> Bool # (/=) :: CreateTableAs b -> CreateTableAs b -> Bool # | |||||
AsRelation (CreateTableAs m) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods asRelation :: CreateTableAs m -> Relation # | |||||
HasDefinition (CreateTableAs m) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods defQuery :: Lens (CreateTableAs m) (CreateTableAs m) Query Query # | |||||
MaybeQuery (CreateTableAs m) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods getQuery :: CreateTableAs m -> Maybe Query # | |||||
TableRef (CreateTableAs m) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs | |||||
HasDeps (CreateTableAs m) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs Methods dependenciesSet :: CreateTableAs m -> Set (Ref Table) # traverseDependencies :: Fold (CreateTableAs m) (Ref Table) # | |||||
type Rep (CreateTableAs b) # | |||||
Defined in Napkin.Spec.Types.CreateTableAs type Rep (CreateTableAs b) = D1 ('MetaData "CreateTableAs" "Napkin.Spec.Types.CreateTableAs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "CreateTableAs" 'PrefixI 'True) (S1 ('MetaSel ('Just "meta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendTableMeta b)) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))) |
Constructors
Query | |
Fields
| |
Union | |
Fields
| |
QueryRaw RawQuery | Escape hatch: A raw query with all the dependencies contained therein. Avoid if possible. |
NativeQuery NativeQuery |
Instances
NFData Query | |||||
Defined in Napkin.Types.Core | |||||
Data Query | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Query -> c Query # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Query # dataTypeOf :: Query -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Query) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Query) # gmapT :: (forall b. Data b => b -> b) -> Query -> Query # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Query -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Query -> r # gmapQ :: (forall d. Data d => d -> u) -> Query -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Query -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Query -> m Query # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Query -> m Query # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Query -> m Query # | |||||
Generic Query | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Query | |||||
Eq Query | |||||
Ord Query | |||||
AsRelation Query | |||||
Defined in Napkin.Types.Core Methods asRelation :: Query -> Relation # | |||||
HasDefinition Query | |||||
MaybeQuery Query | |||||
HasDeps Query | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer Query | |||||
TableRenamer Query | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift Query | |||||
FunRenamer (Selected Query) | |||||
TableRenamer (Selected Query) | |||||
type Rep Query | |||||
Defined in Napkin.Types.Core type Rep Query = D1 ('MetaData "Query" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "Query" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_queryWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses) :*: (S1 ('MetaSel ('Just "_querySelect") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Alias SExp]) :*: S1 ('MetaSel ('Just "_queryComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ColumnComment]))) :*: (S1 ('MetaSel ('Just "_queryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: (S1 ('MetaSel ('Just "_queryTableOperator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ParensOperator)) :*: S1 ('MetaSel ('Just "_queryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp))))) :*: ((S1 ('MetaSel ('Just "_queryHaving") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp)) :*: (S1 ('MetaSel ('Just "_queryGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GroupBy) :*: S1 ('MetaSel ('Just "_queryOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order))) :*: ((S1 ('MetaSel ('Just "_queryLimit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_queryOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_queryDistinct") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Distinctness) :*: S1 ('MetaSel ('Just "_queryAs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AsStruct))))) :+: C1 ('MetaCons "Union" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_unionType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnionType) :*: S1 ('MetaSel ('Just "_unionQuery1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :*: (S1 ('MetaSel ('Just "_unionQuery2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query) :*: S1 ('MetaSel ('Just "_unionWiths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses)))) :+: (C1 ('MetaCons "QueryRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RawQuery)) :+: C1 ('MetaCons "NativeQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeQuery)))) |
describe :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r a -> Sem r a #
Instances
FromJSON Name | |||||
Defined in Napkin.Types.Core | |||||
ToJSON Name | |||||
FoldCase Name | |||||
Defined in Napkin.Types.Core | |||||
NFData Name | |||||
Defined in Napkin.Types.Core | |||||
Monoid Name | |||||
Semigroup Name | |||||
Data Name | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name # dataTypeOf :: Name -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) # gmapT :: (forall b. Data b => b -> b) -> Name -> Name # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # | |||||
IsString Name | |||||
Defined in Napkin.Types.Core Methods fromString :: String -> Name # | |||||
Generic Name | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Name | |||||
Eq Name | |||||
Ord Name | |||||
Hashable Name | |||||
Defined in Napkin.Types.Core | |||||
IsRef Name | |||||
Defined in Napkin.Types.Core | |||||
Lift Name | |||||
Lift (NonEmpty Name) | |||||
Buildable [Name] | |||||
Defined in Napkin.Types.Core | |||||
IsRef (NonEmpty Name) | |||||
IsRef [Name] | |||||
Defined in Napkin.Types.Core | |||||
HasDeps (OMap Name SExp) | |||||
Cons (Ref a) (Ref a) Name Name | |||||
Snoc (Ref a) (Ref a) Name Name | |||||
type Rep Name | |||||
Defined in Napkin.Types.Core type Rep Name = D1 ('MetaData "Name" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Specific" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "Star" 'PrefixI 'False) (U1 :: Type -> Type)) |
($) :: (a -> b) -> a -> b infixr 0 #
is the function application operator.($)
Applying
to a function ($)
f
and an argument x
gives the same result as applying f
to x
directly. The definition is akin to this:
($) :: (a -> b) -> a -> b ($) f x = f x
This is
specialized from id
a -> a
to (a -> b) -> (a -> b)
which by the associativity of (->)
is the same as (a -> b) -> a -> b
.
On the face of it, this may appear pointless! But it's actually one of the most useful and important operators in Haskell.
The order of operations is very different between ($)
and normal function application. Normal function application has precedence 10 - higher than any operator - and associates to the left. So these two definitions are equivalent:
expr = min 5 1 + 5 expr = ((min 5) 1) + 5
($)
has precedence 0 (the lowest) and associates to the right, so these are equivalent:
expr = min 5 $ 1 + 5 expr = (min 5) (1 + 5)
Examples
A common use cases of ($)
is to avoid parentheses in complex expressions.
For example, instead of using nested parentheses in the following Haskell function:
-- | Sum numbers in a string: strSum "100 5 -7" == 98 strSum ::String
->Int
strSum s =sum
(mapMaybe
readMaybe
(words
s))
we can deploy the function application operator:
-- | Sum numbers in a string: strSum "100 5 -7" == 98 strSum ::String
->Int
strSum s =sum
$
mapMaybe
readMaybe
$
words
s
($)
is also used as a section (a partially applied operator), in order to indicate that we wish to apply some yet-unspecified function to a given value. For example, to apply the argument 5
to a list of functions:
applyFive :: [Int] applyFive = map ($ 5) [(+1), (2^)] >>> [6, 32]
Technical Remark (Representation Polymorphism)
($)
is fully representation-polymorphic. This allows it to also be used with arguments of unlifted and even unboxed kinds, such as unboxed integers:
fastMod :: Int -> Int -> Int fastMod (I# x) (I# m) = I# $ remInt# x m
(++) :: [a] -> [a] -> [a] infixr 5 #
(++)
appends two lists, i.e.,
[x1, ..., xm] ++ [y1, ..., yn] == [x1, ..., xm, y1, ..., yn] [x1, ..., xm] ++ [y1, ...] == [x1, ..., xm, y1, ...]
If the first list is not finite, the result is the first list.
Performance considerations
This function takes linear time in the number of elements of the
first list. Thus it is better to associate repeated
applications of (++)
to the right (which is the default behaviour):
xs ++ (ys ++ zs)
or simply xs ++ ys ++ zs
, but not (xs ++ ys) ++ zs
.
For the same reason concat
=
foldr
(++)
[]
has linear performance, while foldl
(++)
[]
is prone
to quadratic slowdown
Examples
>>>
[1, 2, 3] ++ [4, 5, 6]
[1,2,3,4,5,6]
>>>
[] ++ [1, 2, 3]
[1,2,3]
>>>
[3, 2, 1] ++ []
[3,2,1]
(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #
Right to left function composition.
(f . g) x = f (g x)
f . id = f = id . f
Examples
>>>
map ((*2) . length) [[], [0, 1, 2], [0]]
[0,6,2]
>>>
foldr (.) id [(+1), (*3), (^3)] 2
25
>>>
let (...) = (.).(.) in ((*2)...(+)) 5 10
30
(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #
Same as >>=
, but with the arguments interchanged.
as >>= f == f =<< as
const x y
always evaluates to x
, ignoring its second argument.
const x = \_ -> x
This function might seem useless at first glance, but it can be very useful in a higher order context.
Examples
>>>
const 42 "hello"
42
>>>
map (const 42) [0..3]
[42,42,42,42]
flip :: (a -> b -> c) -> b -> a -> c #
takes its (first) two arguments in the reverse order of flip
ff
.
flip f x y = f y x
flip . flip = id
Examples
>>>
flip (++) "hello" "world"
"worldhello"
>>>
let (.>) = flip (.) in (+1) .> show $ 5
"6"
join :: Monad m => m (m a) -> m a #
The join
function is the conventional monad join operator. It
is used to remove one level of monadic structure, projecting its
bound argument into the outer level.
'
' can be understood as the join
bssdo
expression
do bs <- bss bs
Examples
>>>
join [[1, 2, 3], [4, 5, 6], [7, 8, 9]]
[1,2,3,4,5,6,7,8,9]
>>>
join (Just (Just 3))
Just 3
A common use of join
is to run an IO
computation returned from
an STM
transaction, since STM
transactions
can't perform IO
directly. Recall that
atomically
:: STM a -> IO a
is used to run STM
transactions atomically. So, by
specializing the types of atomically
and join
to
atomically
:: STM (IO b) -> IO (IO b)join
:: IO (IO b) -> IO b
we can compose them as
join
.atomically
:: STM (IO b) -> IO b
liftM :: Monad m => (a1 -> r) -> m a1 -> m r #
Promote a function to a monad.
This is equivalent to fmap
but specialised to Monads.
liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #
Promote a function to a monad, scanning the monadic arguments from left to right.
Examples
>>>
liftM2 (+) [0,1] [0,2]
[0,2,1,3]
>>>
liftM2 (+) (Just 1) Nothing
Nothing
>>>
liftM2 (+) (+ 3) (* 2) 5
18
map :: (a -> b) -> [a] -> [b] #
O(n). map
f xs
is the list obtained by applying f
to
each element of xs
, i.e.,
map f [x1, x2, ..., xn] == [f x1, f x2, ..., f xn] map f [x1, x2, ...] == [f x1, f x2, ...]
this means that map id == id
Examples
>>>
map (+1) [1, 2, 3]
[2,3,4]
>>>
map id [1, 2, 3]
[1,2,3]
>>>
map (\n -> 3 * n + 1) [1, 2, 3]
[4,7,10]
when :: Applicative f => Bool -> f () -> f () #
Conditional execution of Applicative
expressions. For example,
Examples
when debug (putStrLn "Debugging")
will output the string Debugging
if the Boolean value debug
is True
, and otherwise do nothing.
>>>
putStr "pi:" >> when False (print 3.14159)
pi:
filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #
This generalizes the list-based filter
function.
runIdentity (filterM (Identity . p) xs) == filter p xs
Examples
>>>
filterM (\x -> do
putStrLn ("Keep: " ++ show x ++ "?") answer <- getLine pure (answer == "y")) [1, 2, 3] Keep: 1? y Keep: 2? n Keep: 3? y [1,3]
>>>
filterM (\x -> do
putStr (show x) x' <- readLn pure (x == x')) [1, 2, 3] 12 22 33 [2,3]
foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #
The foldM
function is analogous to foldl
, except that its result is
encapsulated in a monad. Note that foldM
works from left-to-right over
the list arguments. This could be an issue where (
and the `folded
function' are not commutative.>>
)
foldM f a1 [x1, x2, ..., xm] == do a2 <- f a1 x1 a3 <- f a2 x2 ... f am xm
If right-to-left evaluation is required, the input list should be reversed.
guard :: Alternative f => Bool -> f () #
Conditional failure of Alternative
computations. Defined by
guard True =pure
() guard False =empty
Examples
Common uses of guard
include conditionally signalling an error in
an error monad and conditionally rejecting the current choice in an
Alternative
-based parser.
As an example of signalling an error in the error monad Maybe
,
consider a safe division function safeDiv x y
that returns
Nothing
when the denominator y
is zero and
otherwise. For example:Just
(x `div`
y)
>>>
safeDiv 4 0
Nothing
>>>
safeDiv 4 2
Just 2
A definition of safeDiv
using guards, but not guard
:
safeDiv :: Int -> Int -> Maybe Int safeDiv x y | y /= 0 = Just (x `div` y) | otherwise = Nothing
A definition of safeDiv
using guard
and Monad
do
-notation:
safeDiv :: Int -> Int -> Maybe Int safeDiv x y = do guard (y /= 0) return (x `div` y)
unless :: Applicative f => Bool -> f () -> f () #
The reverse of when
.
Examples
>>>
do x <- getLine
unless (x == "hi") (putStrLn "hi!") comingupwithexamplesisdifficult hi!
>>>
unless (pi > exp 1) Nothing
Just ()
sequence_ :: (Foldable t, Monad m) => t (m a) -> m () #
Evaluate each monadic action in the structure from left to right,
and ignore the results. For a version that doesn't ignore the
results see sequence
.
sequence_
is just like sequenceA_
, but specialised to monadic
actions.
(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 #
An infix synonym for fmap
.
The name of this operator is an allusion to $
.
Note the similarities between their types:
($) :: (a -> b) -> a -> b (<$>) :: Functor f => (a -> b) -> f a -> f b
Whereas $
is function application, <$>
is function
application lifted over a Functor
.
Examples
Convert from a
to a Maybe
Int
using Maybe
String
show
:
>>>
show <$> Nothing
Nothing
>>>
show <$> Just 3
Just "3"
Convert from an
to an
Either
Int
Int
Either
Int
String
using show
:
>>>
show <$> Left 17
Left 17
>>>
show <$> Right 17
Right "17"
Double each element of a list:
>>>
(*2) <$> [1,2,3]
[2,4,6]
Apply even
to the second element of a pair:
>>>
even <$> (2,2)
(2,True)
undefined :: HasCallStack => a #
zip :: [a] -> [b] -> [(a, b)] #
O(min(m,n)). zip
takes two lists and returns a list of
corresponding pairs.
zip
is right-lazy:
>>>
zip [] undefined
[]>>>
zip undefined []
*** Exception: Prelude.undefined ...
zip
is capable of list fusion, but it is restricted to its
first list argument and its resulting list.
Examples
>>>
zip [1, 2, 3] ['a', 'b', 'c']
[(1,'a'),(2,'b'),(3,'c')]
If one input list is shorter than the other, excess elements of the longer list are discarded, even if one of the lists is infinite:
>>>
zip [1] ['a', 'b']
[(1,'a')]
>>>
zip [1, 2] ['a']
[(1,'a')]
>>>
zip [] [1..]
[]
>>>
zip [1..] []
[]
class Functor f => Applicative (f :: Type -> Type) where #
A functor with application, providing operations to
A minimal complete definition must include implementations of pure
and of either <*>
or liftA2
. If it defines both, then they must behave
the same as their default definitions:
(<*>
) =liftA2
id
liftA2
f x y = f<$>
x<*>
y
Further, any definition must satisfy the following:
- Identity
pure
id
<*>
v = v- Composition
pure
(.)<*>
u<*>
v<*>
w = u<*>
(v<*>
w)- Homomorphism
pure
f<*>
pure
x =pure
(f x)- Interchange
u
<*>
pure
y =pure
($
y)<*>
u
The other methods have the following default definitions, which may be overridden with equivalent specialized implementations:
As a consequence of these laws, the Functor
instance for f
will satisfy
It may be useful to note that supposing
forall x y. p (q x y) = f x . g y
it follows from the above that
liftA2
p (liftA2
q u v) =liftA2
f u .liftA2
g v
If f
is also a Monad
, it should satisfy
(which implies that pure
and <*>
satisfy the applicative functor laws).
Methods
Lift a value into the Structure.
Examples
>>>
pure 1 :: Maybe Int
Just 1
>>>
pure 'z' :: [Char]
"z"
>>>
pure (pure ":D") :: Maybe [String]
Just [":D"]
(<*>) :: f (a -> b) -> f a -> f b infixl 4 #
Sequential application.
A few functors support an implementation of <*>
that is more
efficient than the default one.
Example
Used in combination with
, (<$>)
can be used to build a record.(<*>)
>>>
data MyState = MyState {arg1 :: Foo, arg2 :: Bar, arg3 :: Baz}
>>>
produceFoo :: Applicative f => f Foo
>>>
produceBar :: Applicative f => f Bar
>>>
produceBaz :: Applicative f => f Baz
>>>
mkState :: Applicative f => f MyState
>>>
mkState = MyState <$> produceFoo <*> produceBar <*> produceBaz
liftA2 :: (a -> b -> c) -> f a -> f b -> f c #
Lift a binary function to actions.
Some functors support an implementation of liftA2
that is more
efficient than the default one. In particular, if fmap
is an
expensive operation, it is likely better to use liftA2
than to
fmap
over the structure and then use <*>
.
This became a typeclass method in 4.10.0.0. Prior to that, it was
a function defined in terms of <*>
and fmap
.
Example
>>>
liftA2 (,) (Just 3) (Just 5)
Just (3,5)
>>>
liftA2 (+) [1, 2, 3] [4, 5, 6]
[5,6,7,6,7,8,7,8,9]
(*>) :: f a -> f b -> f b infixl 4 #
Sequence actions, discarding the value of the first argument.
Examples
If used in conjunction with the Applicative instance for Maybe
,
you can chain Maybe computations, with a possible "early return"
in case of Nothing
.
>>>
Just 2 *> Just 3
Just 3
>>>
Nothing *> Just 3
Nothing
Of course a more interesting use case would be to have effectful computations instead of just returning pure values.
>>>
import Data.Char
>>>
import GHC.Internal.Text.ParserCombinators.ReadP
>>>
let p = string "my name is " *> munch1 isAlpha <* eof
>>>
readP_to_S p "my name is Simon"
[("Simon","")]
(<*) :: f a -> f b -> f a infixl 4 #
Sequence actions, discarding the value of the second argument.
Instances
Applicative IResult | |
Applicative Parser | |
Applicative Result | |
Applicative Complex | Since: base-4.9.0.0 |
Applicative First | Since: base-4.9.0.0 |
Applicative Last | Since: base-4.9.0.0 |
Applicative Max | Since: base-4.9.0.0 |
Applicative Min | Since: base-4.9.0.0 |
Applicative Seq | Since: containers-0.5.4 |
Applicative Tree | |
Applicative CryptoFailable | |
Defined in Crypto.Error.Types Methods pure :: a -> CryptoFailable a # (<*>) :: CryptoFailable (a -> b) -> CryptoFailable a -> CryptoFailable b # liftA2 :: (a -> b -> c) -> CryptoFailable a -> CryptoFailable b -> CryptoFailable c # (*>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b # (<*) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable a # | |
Applicative CryptoFailable | |
Defined in Crypto.Error.Types Methods pure :: a -> CryptoFailable a # (<*>) :: CryptoFailable (a -> b) -> CryptoFailable a -> CryptoFailable b # liftA2 :: (a -> b -> c) -> CryptoFailable a -> CryptoFailable b -> CryptoFailable c # (*>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b # (<*) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable a # | |
Applicative DNonEmpty | |
Defined in Data.DList.DNonEmpty.Internal | |
Applicative DList | |
Applicative MatchResult | Product is an "or" on fallibility---the combined match result is infallible only if the left and right argument match results both were. This is useful for combining a bunch of alternatives together and then
getting the overall fallibility of the entire group. See |
Defined in GHC.HsToCore.Monad Methods pure :: a -> MatchResult a # (<*>) :: MatchResult (a -> b) -> MatchResult a -> MatchResult b # liftA2 :: (a -> b -> c) -> MatchResult a -> MatchResult b -> MatchResult c # (*>) :: MatchResult a -> MatchResult b -> MatchResult b # (<*) :: MatchResult a -> MatchResult b -> MatchResult a # | |
Applicative PV | |
Applicative SolverStage | |
Defined in GHC.Tc.Solver.Monad Methods pure :: a -> SolverStage a # (<*>) :: SolverStage (a -> b) -> SolverStage a -> SolverStage b # liftA2 :: (a -> b -> c) -> SolverStage a -> SolverStage b -> SolverStage c # (*>) :: SolverStage a -> SolverStage b -> SolverStage b # (<*) :: SolverStage a -> SolverStage b -> SolverStage a # | |
Applicative TcS | |
Applicative NonEmpty | @since base-4.9.0.0 |
Applicative STM | @since base-4.8.0.0 |
Applicative Identity | @since base-4.8.0.0 |
Applicative First | @since base-4.8.0.0 |
Applicative Last | @since base-4.8.0.0 |
Applicative Down | @since base-4.11.0.0 |
Applicative Dual | @since base-4.8.0.0 |
Applicative Product | @since base-4.8.0.0 |
Applicative Sum | @since base-4.8.0.0 |
Applicative ZipList | f <$> ZipList xs1 <*> ... <*> ZipList xsN = ZipList (zipWithN f xs1 ... xsN) where (\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..] = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..]) = ZipList {getZipList = ["a5","b6b6","c7c7c7"]} @since base-2.01 |
Applicative Par1 | @since base-4.9.0.0 |
Applicative P | @since base-4.5.0.0 |
Applicative ReadP | @since base-4.6.0.0 |
Applicative IO | @since base-2.01 |
Applicative Deque | |
Applicative ME | |
Applicative Q | |
Applicative U | |
Applicative Chunk | |
Applicative ComplResult | |
Defined in Options.Applicative.Internal | |
Applicative Completion | |
Defined in Options.Applicative.Internal Methods pure :: a -> Completion a # (<*>) :: Completion (a -> b) -> Completion a -> Completion b # liftA2 :: (a -> b -> c) -> Completion a -> Completion b -> Completion c # (*>) :: Completion a -> Completion b -> Completion b # (<*) :: Completion a -> Completion b -> Completion a # | |
Applicative P | |
Applicative Parser | |
Applicative ParserM | |
Applicative ParserResult | |
Defined in Options.Applicative.Types Methods pure :: a -> ParserResult a # (<*>) :: ParserResult (a -> b) -> ParserResult a -> ParserResult b # liftA2 :: (a -> b -> c) -> ParserResult a -> ParserResult b -> ParserResult c # (*>) :: ParserResult a -> ParserResult b -> ParserResult b # (<*) :: ParserResult a -> ParserResult b -> ParserResult a # | |
Applicative ReadM | |
Applicative Conversion | |
Defined in Database.PostgreSQL.Simple.Internal Methods pure :: a -> Conversion a # (<*>) :: Conversion (a -> b) -> Conversion a -> Conversion b # liftA2 :: (a -> b -> c) -> Conversion a -> Conversion b -> Conversion c # (*>) :: Conversion a -> Conversion b -> Conversion b # (<*) :: Conversion a -> Conversion b -> Conversion a # | |
Applicative RowParser | |
Defined in Database.PostgreSQL.Simple.Internal | |
Applicative Array | |
Applicative SmallArray | |
Defined in Data.Primitive.SmallArray Methods pure :: a -> SmallArray a # (<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b # liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c # (*>) :: SmallArray a -> SmallArray b -> SmallArray b # (<*) :: SmallArray a -> SmallArray b -> SmallArray a # | |
Applicative I | |
Applicative Q | |
Applicative Flat | |
Applicative FlatApp | |
Applicative Vector | |
Applicative Stream | |
Applicative Maybe | @since base-2.01 |
Applicative Solo | @since base-4.15 |
Applicative [] | @since base-2.01 |
Representable f => Applicative (Co f) | |
Applicative (Parser i) | |
Monad m => Applicative (WrappedMonad m) | Since: base-2.1 |
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |
Monad m => Applicative (ZipSource m) | |
Defined in Data.Conduit.Internal.Conduit | |
Applicative (SetM s) | |
Monad m => Applicative (CatchT m) | |
Alternative f => Applicative (Cofree f) | |
Functor f => Applicative (Free f) | |
Arrow a => Applicative (ArrowMonad a) | @since base-4.6.0.0 |
Defined in GHC.Internal.Control.Arrow Methods pure :: a0 -> ArrowMonad a a0 # (<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c # (*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # (<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Applicative (Either e) | @since base-3.0 |
Applicative (Proxy :: Type -> Type) | @since base-4.7.0.0 |
Applicative (U1 :: Type -> Type) | @since base-4.9.0.0 |
Applicative f => Applicative (Yoneda f) | |
Applicative m => Applicative (KatipT m) | |
Applicative m => Applicative (KatipContextT m) | |
Defined in Katip.Monadic Methods pure :: a -> KatipContextT m a # (<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b # liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c # (*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b # (<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a # | |
Applicative m => Applicative (NoLoggingT m) | |
Defined in Katip.Monadic Methods pure :: a -> NoLoggingT m a # (<*>) :: NoLoggingT m (a -> b) -> NoLoggingT m a -> NoLoggingT m b # liftA2 :: (a -> b -> c) -> NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m c # (*>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b # (<*) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m a # | |
Applicative f => Applicative (Indexing f) | |
Defined in Control.Lens.Internal.Indexed | |
Applicative f => Applicative (Indexing64 f) | |
Defined in Control.Lens.Internal.Indexed Methods pure :: a -> Indexing64 f a # (<*>) :: Indexing64 f (a -> b) -> Indexing64 f a -> Indexing64 f b # liftA2 :: (a -> b -> c) -> Indexing64 f a -> Indexing64 f b -> Indexing64 f c # (*>) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f b # (<*) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f a # | |
Applicative (ReifiedFold s) | |
Defined in Control.Lens.Reified Methods pure :: a -> ReifiedFold s a # (<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b # liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c # (*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b # (<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a # | |
Applicative (ReifiedGetter s) | |
Defined in Control.Lens.Reified Methods pure :: a -> ReifiedGetter s a # (<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b # liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c # (*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b # (<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a # | |
Applicative f => Applicative (WrappedPoly f) | |
Defined in Data.MonoTraversable Methods pure :: a -> WrappedPoly f a # (<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b # liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c # (*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b # (<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a # | |
Applicative (Spec b) | |
Monad m => Applicative (ListT m) | |
Monad m => Applicative (NondetT m) | |
Defined in Options.Applicative.Internal | |
Applicative (Sem f) | |
Applicative m => Applicative (ResourceT m) | |
Defined in Control.Monad.Trans.Resource.Internal | |
Applicative (RIO env) | |
Applicative m => Applicative (ActionT m) | |
Defined in Web.Scotty.Internal.Types | |
Applicative (ScottyT m) | |
Defined in Web.Scotty.Internal.Types | |
Semigroup a => Applicative (These a) | |
Applicative (IParser t) | |
Semigroup a => Applicative (These a) | |
Applicative f => Applicative (Lift f) | A combination is |
(Functor m, Monad m) => Applicative (MaybeT m) | |
MonadUnliftIO m => Applicative (Conc m) | Since: unliftio-0.2.9.0 |
MonadUnliftIO m => Applicative (Concurrently m) | Since: unliftio-0.1.0.0 |
Defined in UnliftIO.Internals.Async Methods pure :: a -> Concurrently m a # (<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b # liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c # (*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b # (<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a # | |
Monoid a => Applicative ((,) a) | For tuples, the ("hello ", (+15)) <*> ("world!", 2002) ("hello world!",2017) @since base-2.01 |
Arrow a => Applicative (WrappedArrow a b) | Since: base-2.1 |
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
Biapplicative p => Applicative (Fix p) | |
Biapplicative p => Applicative (Join p) | |
Monad m => Applicative (ZipSink i m) | |
Defined in Data.Conduit.Internal.Conduit | |
(Applicative f, Monad f) => Applicative (WhenMissing f x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
(Alternative f, Applicative w) => Applicative (CofreeT f w) | |
Defined in Control.Comonad.Trans.Cofree | |
(Functor f, Monad m) => Applicative (FreeT f m) | |
Defined in Control.Monad.Trans.Free | |
(Applicative f, Monad f) => Applicative (WhenMissing f x) | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
Applicative m => Applicative (Kleisli m a) | @since base-4.14.0.0 |
Defined in GHC.Internal.Control.Arrow | |
Monoid m => Applicative (Const m :: Type -> Type) | @since base-2.0.1 |
Applicative f => Applicative (Ap f) | @since base-4.12.0.0 |
Applicative f => Applicative (Alt f) | @since base-4.8.0.0 |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) | @since base-4.17.0.0 |
Defined in GHC.Internal.Generics Methods pure :: a -> Generically1 f a # (<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b # liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c # (*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b # (<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a # | |
Applicative f => Applicative (Rec1 f) | @since base-4.9.0.0 |
Applicative f => Applicative (Indexing f) | |
(Applicative f, Applicative g) => Applicative (Day f g) | |
Applicative (Indexed i a) | |
Defined in Control.Lens.Internal.Indexed | |
Applicative (Flows i b) | This is an illegal |
Defined in Control.Lens.Internal.Level | |
Applicative (Mafic a b) | |
Defined in Control.Lens.Internal.Magma | |
(Monad m, Monoid r) => Applicative (Effect m r) | |
Defined in Control.Lens.Internal.Zoom | |
(Monad m, Monoid s) => Applicative (Focusing m s) | |
Defined in Control.Lens.Internal.Zoom | |
Applicative (k (May s)) => Applicative (FocusingMay k s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingMay k s a # (<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b # liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c # (*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b # (<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a # | |
Monoid m => Applicative (Holes t m) | |
(Monad m, Monoid r) => Applicative (Effect m r) | |
Defined in Lens.Micro.Mtl.Internal | |
(Monad m, Monoid s) => Applicative (Focusing m s) | |
Defined in Lens.Micro.Mtl.Internal | |
Applicative (k (May s)) => Applicative (FocusingMay k s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> FocusingMay k s a # (<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b # liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c # (*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b # (<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a # | |
Applicative (t m) => Applicative (LiftingAccum t m) | Since: mtl-2.3 |
Defined in Control.Monad.Accum Methods pure :: a -> LiftingAccum t m a # (<*>) :: LiftingAccum t m (a -> b) -> LiftingAccum t m a -> LiftingAccum t m b # liftA2 :: (a -> b -> c) -> LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m c # (*>) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m b # (<*) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m a # | |
Applicative (t m) => Applicative (LiftingSelect t m) | Since: mtl-2.3 |
Defined in Control.Monad.Select Methods pure :: a -> LiftingSelect t m a # (<*>) :: LiftingSelect t m (a -> b) -> LiftingSelect t m a -> LiftingSelect t m b # liftA2 :: (a -> b -> c) -> LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m c # (*>) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m b # (<*) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m a # | |
Applicative (NonDetC m) | |
(Applicative (Rep p), Representable p) => Applicative (Prep p) | |
Monoid a => Applicative (K a :: Type -> Type) | |
Applicative (Tagged s) | |
Applicative f => Applicative (Backwards f) | Apply |
Defined in Control.Applicative.Backwards | |
(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) | |
Defined in Control.Monad.Trans.Accum | |
(Functor m, Monad m) => Applicative (ExceptT e m) | |
Defined in Control.Monad.Trans.Except | |
Applicative m => Applicative (IdentityT m) | |
Defined in Control.Monad.Trans.Identity | |
Applicative m => Applicative (ReaderT r m) | |
Defined in Control.Monad.Trans.Reader | |
(Functor m, Monad m) => Applicative (SelectT r m) | |
Defined in Control.Monad.Trans.Select | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Lazy | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Strict | |
(Functor m, Monad m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.CPS | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Strict | |
Monoid a => Applicative (Constant a :: Type -> Type) | |
Defined in Data.Functor.Constant | |
Applicative f => Applicative (Reverse f) | Derived instance. |
(Monoid a, Monoid b) => Applicative ((,,) a b) | @since base-4.14.0.0 |
(Applicative f, Applicative g) => Applicative (Product f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Product | |
Applicative (ConduitT i o m) | |
Defined in Data.Conduit.Internal.Conduit Methods pure :: a -> ConduitT i o m a # (<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b # liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c # (*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b # (<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a # | |
Monad m => Applicative (ZipConduit i o m) | |
Defined in Data.Conduit.Internal.Conduit Methods pure :: a -> ZipConduit i o m a # (<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b # liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c # (*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b # (<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a # | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Applicative (WhenMissing f k x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods pure :: a -> WhenMissing f k x a # (<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b # liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c # (*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # (<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a # | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Applicative g) => Applicative (f :*: g) | @since base-4.9.0.0 |
Monoid c => Applicative (K1 i c :: Type -> Type) | @since base-4.12.0.0 |
Applicative (Bazaar p a b) | |
Defined in Control.Lens.Internal.Bazaar Methods pure :: a0 -> Bazaar p a b a0 # (<*>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 # liftA2 :: (a0 -> b0 -> c) -> Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b c # (*>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 # (<*) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 # | |
Applicative (Molten i a b) | |
Defined in Control.Lens.Internal.Magma Methods pure :: a0 -> Molten i a b a0 # (<*>) :: Molten i a b (a0 -> b0) -> Molten i a b a0 -> Molten i a b b0 # liftA2 :: (a0 -> b0 -> c) -> Molten i a b a0 -> Molten i a b b0 -> Molten i a b c # (*>) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b b0 # (<*) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b a0 # | |
Applicative (k (Err e s)) => Applicative (FocusingErr e k s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingErr e k s a # (<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b # liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c # (*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b # (<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a # | |
Applicative (k (f s)) => Applicative (FocusingOn f k s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingOn f k s a # (<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b # liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c # (*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b # (<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a # | |
Applicative (k (s, w)) => Applicative (FocusingPlus w k s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingPlus w k s a # (<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b # liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c # (*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b # (<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a # | |
(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingWith w m s a # (<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b # liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c # (*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b # (<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a # | |
Applicative (k (Err e s)) => Applicative (FocusingErr e k s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> FocusingErr e k s a # (<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b # liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c # (*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b # (<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a # | |
Applicative (k (f s)) => Applicative (FocusingOn f k s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> FocusingOn f k s a # (<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b # liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c # (*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b # (<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a # | |
Applicative (k (s, w)) => Applicative (FocusingPlus w k s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> FocusingPlus w k s a # (<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b # liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c # (*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b # (<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a # | |
(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> FocusingWith w m s a # (<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b # liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c # (*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b # (<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a # | |
Applicative (ContT r m) | |
Defined in Control.Monad.Trans.Cont | |
(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) | @since base-4.14.0.0 |
Defined in GHC.Internal.Base | |
Applicative ((->) r) | @since base-2.01 |
(Applicative f, Applicative g) => Applicative (Compose f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose | |
(Monad f, Applicative f) => Applicative (WhenMatched f k x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods pure :: a -> WhenMatched f k x y a # (<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c # (*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # (<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a # | |
(Applicative f, Applicative g) => Applicative (f :.: g) | @since base-4.9.0.0 |
Applicative f => Applicative (M1 i c f) | @since base-4.9.0.0 |
Applicative (BazaarT p g a b) | |
Defined in Control.Lens.Internal.Bazaar Methods pure :: a0 -> BazaarT p g a b a0 # (<*>) :: BazaarT p g a b (a0 -> b0) -> BazaarT p g a b a0 -> BazaarT p g a b b0 # liftA2 :: (a0 -> b0 -> c) -> BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b c # (*>) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b b0 # (<*) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 # | |
Applicative (TakingWhile p f a b) | |
Defined in Control.Lens.Internal.Magma Methods pure :: a0 -> TakingWhile p f a b a0 # (<*>) :: TakingWhile p f a b (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 # liftA2 :: (a0 -> b0 -> c) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b c # (*>) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b b0 # (<*) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 # | |
(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> EffectRWS w st m s a # (<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b # liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c # (*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b # (<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a # | |
Applicative (k (Freed f m s)) => Applicative (FocusingFree f m k s) | |
Defined in Control.Lens.Internal.Zoom Methods pure :: a -> FocusingFree f m k s a # (<*>) :: FocusingFree f m k s (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b # liftA2 :: (a -> b -> c) -> FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s c # (*>) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s b # (<*) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s a # | |
(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) | |
Defined in Lens.Micro.Mtl.Internal Methods pure :: a -> EffectRWS w st m s a # (<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b # liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c # (*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b # (<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a # | |
Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) | |
Defined in Data.Reflection Methods pure :: a -> ReflectedApplicative f s a # (<*>) :: ReflectedApplicative f s (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b # liftA2 :: (a -> b -> c) -> ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s c # (*>) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s b # (<*) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s a # | |
(Applicative f, Applicative g) => Applicative (f :.: g) | Since: sop-core-0.2.5.0 |
(Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.CPS | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Lazy | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Strict | |
Monad state => Applicative (Builder collection mutCollection step state err) | |
Defined in Basement.MutableBuilder Methods pure :: a -> Builder collection mutCollection step state err a # (<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b # liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c # (*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b # (<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a # | |
Monad m => Applicative (Pipe l i o u m) | |
Defined in Data.Conduit.Internal.Pipe Methods pure :: a -> Pipe l i o u m a # (<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b # liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c # (*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b # (<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a # |
class Functor (f :: Type -> Type) where #
A type f
is a Functor if it provides a function fmap
which, given any types a
and b
lets you apply any function from (a -> b)
to turn an f a
into an f b
, preserving the
structure of f
. Furthermore f
needs to adhere to the following:
Note, that the second law follows from the free theorem of the type fmap
and
the first law, so you need only check that the former condition holds.
See these articles by School of Haskell or
David Luposchainsky
for an explanation.
Minimal complete definition
Methods
fmap :: (a -> b) -> f a -> f b #
fmap
is used to apply a function of type (a -> b)
to a value of type f a
,
where f is a functor, to produce a value of type f b
.
Note that for any type constructor with more than one parameter (e.g., Either
),
only the last type parameter can be modified with fmap
(e.g., b
in `Either a b`).
Some type constructors with two parameters or more have a
instance that allows
both the last and the penultimate parameters to be mapped over.Bifunctor
Examples
Convert from a
to a Maybe
IntMaybe String
using show
:
>>>
fmap show Nothing
Nothing>>>
fmap show (Just 3)
Just "3"
Convert from an
to an
Either
Int IntEither Int String
using show
:
>>>
fmap show (Left 17)
Left 17>>>
fmap show (Right 17)
Right "17"
Double each element of a list:
>>>
fmap (*2) [1,2,3]
[2,4,6]
Apply even
to the second element of a pair:
>>>
fmap even (2,2)
(2,True)
It may seem surprising that the function is only applied to the last element of the tuple
compared to the list example above which applies it to every element in the list.
To understand, remember that tuples are type constructors with multiple type parameters:
a tuple of 3 elements (a,b,c)
can also be written (,,) a b c
and its Functor
instance
is defined for Functor ((,,) a b)
(i.e., only the third parameter is free to be mapped over
with fmap
).
It explains why fmap
can be used with tuples containing values of different types as in the
following example:
>>>
fmap even ("hello", 1.0, 4)
("hello",1.0,True)
Instances
Functor Only | |
Functor KeyMap | |
Functor FromJSONKeyFunction | Only law abiding up to interpretation |
Defined in Data.Aeson.Types.FromJSON Methods fmap :: (a -> b) -> FromJSONKeyFunction a -> FromJSONKeyFunction b # (<$) :: a -> FromJSONKeyFunction b -> FromJSONKeyFunction a # | |
Functor IResult | |
Functor Parser | |
Functor Result | |
Functor WithJSONWarnings | |
Defined in Data.Aeson.WarningParser Methods fmap :: (a -> b) -> WithJSONWarnings a -> WithJSONWarnings b # (<$) :: a -> WithJSONWarnings b -> WithJSONWarnings a # | |
Functor Complex | Since: base-4.9.0.0 |
Functor First | Since: base-4.9.0.0 |
Functor Last | Since: base-4.9.0.0 |
Functor Max | Since: base-4.9.0.0 |
Functor Min | Since: base-4.9.0.0 |
Functor ArgDescr | Since: base-4.7.0.0 |
Functor ArgOrder | Since: base-4.7.0.0 |
Functor OptDescr | Since: base-4.7.0.0 |
Functor Flush | |
Functor SCC | Since: containers-0.5.4 |
Functor IntMap | |
Functor Digit | |
Functor Elem | |
Functor FingerTree | |
Defined in Data.Sequence.Internal Methods fmap :: (a -> b) -> FingerTree a -> FingerTree b # (<$) :: a -> FingerTree b -> FingerTree a # | |
Functor Node | |
Functor Seq | |
Functor ViewL | |
Functor ViewR | |
Functor Tree | |
Functor CryptoFailable | |
Defined in Crypto.Error.Types Methods fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b # (<$) :: a -> CryptoFailable b -> CryptoFailable a # | |
Functor CryptoFailable | |
Defined in Crypto.Error.Types Methods fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b # (<$) :: a -> CryptoFailable b -> CryptoFailable a # | |
Functor DNonEmpty | |
Functor DList | |
Functor LabelMap | |
Functor AltMap | |
Defined in GHC.Core.Map.Expr | |
Functor CoreMap | |
Functor CoreMapX | |
Defined in GHC.Core.Map.Expr | |
Functor BndrMap | |
Functor CoercionMap | |
Defined in GHC.Core.Map.Type | |
Functor CoercionMapX | |
Defined in GHC.Core.Map.Type | |
Functor LooseTypeMap | |
Defined in GHC.Core.Map.Type Methods fmap :: (a -> b) -> LooseTypeMap a -> LooseTypeMap b # (<$) :: a -> LooseTypeMap b -> LooseTypeMap a # | |
Functor TyLitMap | |
Defined in GHC.Core.Map.Type | |
Functor TypeMap | |
Functor TypeMapX | |
Defined in GHC.Core.Map.Type | |
Functor VarMap | |
Functor Bag | |
Functor Word64Map | |
Functor MatchResult | |
Defined in GHC.HsToCore.Monad Methods fmap :: (a -> b) -> MatchResult a -> MatchResult b # (<$) :: a -> MatchResult b -> MatchResult a # | |
Functor EpAnn | |
Functor PV | |
Functor PV_Result | |
Defined in GHC.Parser.PostProcess | |
Functor ConAppMap | |
Defined in GHC.Stg.CSE | |
Functor StgArgMap | |
Defined in GHC.Stg.CSE | |
Functor SolverStage | |
Defined in GHC.Tc.Solver.Monad Methods fmap :: (a -> b) -> SolverStage a -> SolverStage b # (<$) :: a -> SolverStage b -> SolverStage a # | |
Functor StopOrContinue | |
Defined in GHC.Tc.Solver.Monad Methods fmap :: (a -> b) -> StopOrContinue a -> StopOrContinue b # (<$) :: a -> StopOrContinue b -> StopOrContinue a # | |
Functor TcS | |
Functor TyConFlavour | |
Defined in GHC.Types.Basic Methods fmap :: (a -> b) -> TyConFlavour a -> TyConFlavour b # (<$) :: a -> TyConFlavour b -> TyConFlavour a # | |
Functor Messages | |
Functor MsgEnvelope | |
Defined in GHC.Types.Error Methods fmap :: (a -> b) -> MsgEnvelope a -> MsgEnvelope b # (<$) :: a -> MsgEnvelope b -> MsgEnvelope a # | |
Functor OccEnv | |
Functor Definite | |
Functor GenModule | |
Functor GenWithIsBoot | |
Defined in GHC.Unit.Types Methods fmap :: (a -> b) -> GenWithIsBoot a -> GenWithIsBoot b # (<$) :: a -> GenWithIsBoot b -> GenWithIsBoot a # | |
Functor DataDefnCons | |
Defined in Language.Haskell.Syntax.Decls Methods fmap :: (a -> b) -> DataDefnCons a -> DataDefnCons b # (<$) :: a -> DataDefnCons b -> DataDefnCons a # | |
Functor SizedSeq | |
Functor GenClosure | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenClosure a -> GenClosure b # (<$) :: a -> GenClosure b -> GenClosure a # | |
Functor GenStackField | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStackField a -> GenStackField b # (<$) :: a -> GenStackField b -> GenStackField a # | |
Functor GenStackFrame | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStackFrame a -> GenStackFrame b # (<$) :: a -> GenStackFrame b -> GenStackFrame a # | |
Functor GenStgStackClosure | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStgStackClosure a -> GenStgStackClosure b # (<$) :: a -> GenStgStackClosure b -> GenStgStackClosure a # | |
Functor NonEmpty | @since base-4.9.0.0 |
Functor STM | @since base-4.3.0.0 |
Functor Identity | @since base-4.8.0.0 |
Functor First | @since base-4.8.0.0 |
Functor Last | @since base-4.8.0.0 |
Functor Down | @since base-4.11.0.0 |
Functor Dual | @since base-4.8.0.0 |
Functor Product | @since base-4.8.0.0 |
Functor Sum | @since base-4.8.0.0 |
Functor ZipList | @since base-2.01 |
Functor Par1 | @since base-4.9.0.0 |
Functor P | @since base-4.8.0.0 |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
Functor ReadP | @since base-2.01 |
Functor IO | @since base-2.01 |
Functor ListOf | |
Functor NonGreedy | |
Functor Activation | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> Activation a -> Activation b # (<$) :: a -> Activation b -> Activation a # | |
Functor Alt | |
Functor Annotation | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> Annotation a -> Annotation b # (<$) :: a -> Annotation b -> Annotation a # | |
Functor Assoc | |
Functor Asst | |
Functor BangType | |
Functor Binds | |
Functor BooleanFormula | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> BooleanFormula a -> BooleanFormula b # (<$) :: a -> BooleanFormula b -> BooleanFormula a # | |
Functor Bracket | |
Functor CName | |
Functor CallConv | |
Functor ClassDecl | |
Functor ConDecl | |
Functor Context | |
Functor DataOrNew | |
Functor Decl | |
Functor DeclHead | |
Functor DerivStrategy | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> DerivStrategy a -> DerivStrategy b # (<$) :: a -> DerivStrategy b -> DerivStrategy a # | |
Functor Deriving | |
Functor EWildcard | |
Functor Exp | |
Functor ExportSpec | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ExportSpec a -> ExportSpec b # (<$) :: a -> ExportSpec b -> ExportSpec a # | |
Functor ExportSpecList | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ExportSpecList a -> ExportSpecList b # (<$) :: a -> ExportSpecList b -> ExportSpecList a # | |
Functor FieldDecl | |
Functor FieldUpdate | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> FieldUpdate a -> FieldUpdate b # (<$) :: a -> FieldUpdate b -> FieldUpdate a # | |
Functor FunDep | |
Functor GadtDecl | |
Functor GuardedRhs | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> GuardedRhs a -> GuardedRhs b # (<$) :: a -> GuardedRhs b -> GuardedRhs a # | |
Functor IPBind | |
Functor IPName | |
Functor ImportDecl | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ImportDecl a -> ImportDecl b # (<$) :: a -> ImportDecl b -> ImportDecl a # | |
Functor ImportSpec | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ImportSpec a -> ImportSpec b # (<$) :: a -> ImportSpec b -> ImportSpec a # | |
Functor ImportSpecList | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ImportSpecList a -> ImportSpecList b # (<$) :: a -> ImportSpecList b -> ImportSpecList a # | |
Functor InjectivityInfo | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> InjectivityInfo a -> InjectivityInfo b # (<$) :: a -> InjectivityInfo b -> InjectivityInfo a # | |
Functor InstDecl | |
Functor InstHead | |
Functor InstRule | |
Functor Literal | |
Functor Match | |
Functor MaybePromotedName | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> MaybePromotedName a -> MaybePromotedName b # (<$) :: a -> MaybePromotedName b -> MaybePromotedName a # | |
Functor Module | |
Functor ModuleHead | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ModuleHead a -> ModuleHead b # (<$) :: a -> ModuleHead b -> ModuleHead a # | |
Functor ModuleName | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ModuleName a -> ModuleName b # (<$) :: a -> ModuleName b -> ModuleName a # | |
Functor ModulePragma | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> ModulePragma a -> ModulePragma b # (<$) :: a -> ModulePragma b -> ModulePragma a # | |
Functor Name | |
Functor Namespace | |
Functor Op | |
Functor Overlap | |
Functor PXAttr | |
Functor Pat | |
Functor PatField | |
Functor PatternSynDirection | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> PatternSynDirection a -> PatternSynDirection b # (<$) :: a -> PatternSynDirection b -> PatternSynDirection a # | |
Functor Promoted | |
Functor QName | |
Functor QOp | |
Functor QualConDecl | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> QualConDecl a -> QualConDecl b # (<$) :: a -> QualConDecl b -> QualConDecl a # | |
Functor QualStmt | |
Functor RPat | |
Functor RPatOp | |
Functor ResultSig | |
Functor Rhs | |
Functor Role | |
Functor Rule | |
Functor RuleVar | |
Functor Safety | |
Functor Sign | |
Functor SpecialCon | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> SpecialCon a -> SpecialCon b # (<$) :: a -> SpecialCon b -> SpecialCon a # | |
Functor Splice | |
Functor Stmt | |
Functor TyVarBind | |
Functor Type | |
Functor TypeEqn | |
Functor Unpackedness | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> Unpackedness a -> Unpackedness b # (<$) :: a -> Unpackedness b -> Unpackedness a # | |
Functor WarningText | |
Defined in Language.Haskell.Exts.Syntax Methods fmap :: (a -> b) -> WarningText a -> WarningText b # (<$) :: a -> WarningText b -> WarningText a # | |
Functor XAttr | |
Functor XName | |
Functor HistoriedResponse | |
Defined in Network.HTTP.Client Methods fmap :: (a -> b) -> HistoriedResponse a -> HistoriedResponse b # (<$) :: a -> HistoriedResponse b -> HistoriedResponse a # | |
Functor Response | |
Functor Item | |
Functor Deque | |
Functor ErrorFancy | |
Defined in Text.Megaparsec.Error Methods fmap :: (a -> b) -> ErrorFancy a -> ErrorFancy b # (<$) :: a -> ErrorFancy b -> ErrorFancy a # | |
Functor ErrorItem | |
Functor WithSpecTable | |
Defined in Napkin.Types.Core Methods fmap :: (a -> b) -> WithSpecTable a -> WithSpecTable b # (<$) :: a -> WithSpecTable b -> WithSpecTable a # | |
Functor ME | |
Functor Q | |
Functor U | |
Functor Chunk | |
Functor ComplResult | |
Defined in Options.Applicative.Internal | |
Functor Completion | |
Defined in Options.Applicative.Internal Methods fmap :: (a -> b) -> Completion a -> Completion b # (<$) :: a -> Completion b -> Completion a # | |
Functor P | |
Functor CReader | |
Functor OptReader | |
Functor Option | |
Functor Parser | |
Functor ParserFailure | |
Defined in Options.Applicative.Types Methods fmap :: (a -> b) -> ParserFailure a -> ParserFailure b # (<$) :: a -> ParserFailure b -> ParserFailure a # | |
Functor ParserInfo | |
Defined in Options.Applicative.Types Methods fmap :: (a -> b) -> ParserInfo a -> ParserInfo b # (<$) :: a -> ParserInfo b -> ParserInfo a # | |
Functor ParserM | |
Functor ParserResult | |
Defined in Options.Applicative.Types Methods fmap :: (a -> b) -> ParserResult a -> ParserResult b # (<$) :: a -> ParserResult b -> ParserResult a # | |
Functor ReadM | |
Functor Conversion | |
Defined in Database.PostgreSQL.Simple.Internal Methods fmap :: (a -> b) -> Conversion a -> Conversion b # (<$) :: a -> Conversion b -> Conversion a # | |
Functor RowParser | |
Functor AnnotDetails | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Methods fmap :: (a -> b) -> AnnotDetails a -> AnnotDetails b # (<$) :: a -> AnnotDetails b -> AnnotDetails a # | |
Functor Doc | |
Functor Span | |
Functor Doc | Alter the document’s annotations. This instance makes |
Functor FlattenResult | |
Defined in Prettyprinter.Internal | |
Functor SimpleDocStream | Alter the document’s annotations. This instance makes |
Defined in Prettyprinter.Internal Methods fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b # (<$) :: a -> SimpleDocStream b -> SimpleDocStream a # | |
Functor Array | |
Functor SmallArray | |
Defined in Data.Primitive.SmallArray Methods fmap :: (a -> b) -> SmallArray a -> SmallArray b # (<$) :: a -> SmallArray b -> SmallArray a # | |
Functor I | |
Functor Maybe | |
Functor Q | |
Functor TyVarBndr | |
Functor Flat | |
Functor FlatApp | |
Functor Vector | |
Functor Stream | |
Defined in Codec.Compression.Zlib.Stream | |
Functor Maybe | @since base-2.01 |
Functor Solo | @since base-4.15 |
Functor [] | @since base-2.01 |
Defined in GHC.Internal.Base | |
Functor f => Functor (Co f) | |
Functor (TkArray k) | |
Functor (TkRecord k) | |
Functor (Tokens k) | |
Functor (IResult i) | |
Defined in Data.Attoparsec.Internal.Types | |
Functor (Parser i) | |
Defined in Data.Attoparsec.Internal.Types | |
Monad m => Functor (WrappedMonad m) | Since: base-2.1 |
Defined in Control.Applicative Methods fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b # (<$) :: a -> WrappedMonad m b -> WrappedMonad m a # | |
Functor (Arg a) | Since: base-4.9.0.0 |
Monad m => Functor (ZipSource m) | |
Functor (SetM s) | |
Defined in Data.Graph | |
Functor (Map k) | |
Monad m => Functor (Handler m) | |
Monad m => Functor (CatchT m) | |
Functor f => Functor (Cofree f) | |
Functor f => Functor (Free f) | |
Functor (MaybeO ex) | |
Functor (Gr a) | |
Functor m => Functor (GenMap m) | |
Functor m => Functor (ListMap m) | |
Functor m => Functor (MaybeMap m) | |
Functor (GenLocated l) | |
Defined in GHC.Types.SrcLoc Methods fmap :: (a -> b) -> GenLocated l a -> GenLocated l b # (<$) :: a -> GenLocated l b -> GenLocated l a # | |
Functor (UniqMap k) | |
Functor (HsFieldBind lhs) | |
Defined in Language.Haskell.Syntax.Pat Methods fmap :: (a -> b) -> HsFieldBind lhs a -> HsFieldBind lhs b # (<$) :: a -> HsFieldBind lhs b -> HsFieldBind lhs a # | |
Arrow a => Functor (ArrowMonad a) | @since base-4.6.0.0 |
Defined in GHC.Internal.Control.Arrow Methods fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # (<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Functor (Either a) | @since base-3.0 |
Functor (Proxy :: Type -> Type) | @since base-4.7.0.0 |
Functor (U1 :: Type -> Type) | @since base-4.9.0.0 |
Functor (V1 :: Type -> Type) | @since base-4.9.0.0 |
Functor (Yoneda f) | |
Functor m => Functor (KatipT m) | |
Functor m => Functor (KatipContextT m) | |
Defined in Katip.Monadic Methods fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b # (<$) :: a -> KatipContextT m b -> KatipContextT m a # | |
Functor m => Functor (NoLoggingT m) | |
Defined in Katip.Monadic Methods fmap :: (a -> b) -> NoLoggingT m a -> NoLoggingT m b # (<$) :: a -> NoLoggingT m b -> NoLoggingT m a # | |
Functor f => Functor (Indexing f) | |
Functor f => Functor (Indexing64 f) | |
Defined in Control.Lens.Internal.Indexed Methods fmap :: (a -> b) -> Indexing64 f a -> Indexing64 f b # (<$) :: a -> Indexing64 f b -> Indexing64 f a # | |
Functor (Level i) | |
Functor f => Functor (First1 f) | |
Defined in Control.Lens.Lens | |
Functor (ReifiedFold s) | |
Defined in Control.Lens.Reified Methods fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b # (<$) :: a -> ReifiedFold s b -> ReifiedFold s a # | |
Functor (ReifiedGetter s) | |
Defined in Control.Lens.Reified Methods fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b # (<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a # | |
Functor f => Functor (WrappedPoly f) | |
Defined in Data.MonoTraversable Methods fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b # (<$) :: a -> WrappedPoly f b -> WrappedPoly f a # | |
Functor (Spec b) | |
Monad m => Functor (ListT m) | |
Monad m => Functor (NondetT m) | |
Functor (OMap k) | Since: ordered-containers-0.2 |
Functor (Sem f) | |
Functor m => Functor (ResourceT m) | |
Functor (RIO env) | |
Functor m => Functor (ActionT m) | |
Functor (ScottyT m) | |
Functor (Either a) | |
Functor (These a) | |
Functor (Pair e) | |
Functor (IParser t) | |
Functor (These a) | |
Functor f => Functor (Lift f) | |
Functor m => Functor (MaybeT m) | |
Functor m => Functor (Conc m) | |
Monad m => Functor (Concurrently m) | Since: unliftio-0.1.0.0 |
Defined in UnliftIO.Internals.Async Methods fmap :: (a -> b) -> Concurrently m a -> Concurrently m b # (<$) :: a -> Concurrently m b -> Concurrently m a # | |
Functor (HashMap k) | |
Functor ((,) a) | @since base-2.01 |
Defined in GHC.Internal.Base | |
Arrow a => Functor (WrappedArrow a b) | Since: base-2.1 |
Defined in Control.Applicative Methods fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # (<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
Bifunctor p => Functor (Fix p) | |
Bifunctor p => Functor (Join p) | |
Monad m => Functor (ZipSink i m) | |
(Applicative f, Monad f) => Functor (WhenMissing f x) | Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b # (<$) :: a -> WhenMissing f x b -> WhenMissing f x a # | |
Functor f => Functor (CofreeF f a) | |
(Functor f, Functor w) => Functor (CofreeT f w) | |
Functor f => Functor (FreeF f a) | |
(Functor f, Functor m) => Functor (FreeT f m) | |
(Applicative f, Monad f) => Functor (WhenMissing f x) | Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b # (<$) :: a -> WhenMissing f x b -> WhenMissing f x a # | |
Functor m => Functor (Kleisli m a) | @since base-4.14.0.0 |
Functor (Const m :: Type -> Type) | @since base-2.01 |
Functor f => Functor (Ap f) | @since base-4.12.0.0 |
Functor f => Functor (Alt f) | @since base-4.8.0.0 |
(Generic1 f, Functor (Rep1 f)) => Functor (Generically1 f) | @since base-4.17.0.0 |
Defined in GHC.Internal.Generics Methods fmap :: (a -> b) -> Generically1 f a -> Generically1 f b # (<$) :: a -> Generically1 f b -> Generically1 f a # | |
Functor f => Functor (Rec1 f) | @since base-4.9.0.0 |
Functor (URec (Ptr ()) :: Type -> Type) | @since base-4.9.0.0 |
Functor (URec Char :: Type -> Type) | @since base-4.9.0.0 |
Functor (URec Double :: Type -> Type) | @since base-4.9.0.0 |
Functor (URec Float :: Type -> Type) | @since base-4.9.0.0 |
Functor (URec Int :: Type -> Type) | @since base-4.9.0.0 |
Functor (URec Word :: Type -> Type) | @since base-4.9.0.0 |
Functor f => Functor (Indexing f) | |
Functor (Day f g) | |
Functor (Context a b) | |
Functor f => Functor (AlongsideLeft f b) | |
Defined in Control.Lens.Internal.Getter Methods fmap :: (a -> b0) -> AlongsideLeft f b a -> AlongsideLeft f b b0 # (<$) :: a -> AlongsideLeft f b b0 -> AlongsideLeft f b a # | |
Functor f => Functor (AlongsideRight f a) | |
Defined in Control.Lens.Internal.Getter Methods fmap :: (a0 -> b) -> AlongsideRight f a a0 -> AlongsideRight f a b # (<$) :: a0 -> AlongsideRight f a b -> AlongsideRight f a a0 # | |
Functor (Indexed i a) | |
Functor (Flows i b) | |
Functor (Mafic a b) | |
Functor (Effect m r) | |
Monad m => Functor (Focusing m s) | |
Functor (k (May s)) => Functor (FocusingMay k s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b # (<$) :: a -> FocusingMay k s b -> FocusingMay k s a # | |
Functor (ReifiedIndexedFold i s) | |
Defined in Control.Lens.Reified Methods fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b # (<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a # | |
Functor (ReifiedIndexedGetter i s) | |
Defined in Control.Lens.Reified Methods fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b # (<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a # | |
Functor (Holes t m) | |
Defined in Control.Lens.Traversal | |
Monad m => Functor (Handler e m) | |
Functor (Effect m r) | |
Monad m => Functor (Focusing m s) | |
Functor (k (May s)) => Functor (FocusingMay k s) | |
Defined in Lens.Micro.Mtl.Internal Methods fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b # (<$) :: a -> FocusingMay k s b -> FocusingMay k s a # | |
Functor (t m) => Functor (LiftingAccum t m) | Since: mtl-2.3 |
Defined in Control.Monad.Accum Methods fmap :: (a -> b) -> LiftingAccum t m a -> LiftingAccum t m b # (<$) :: a -> LiftingAccum t m b -> LiftingAccum t m a # | |
Functor (t m) => Functor (LiftingSelect t m) | Since: mtl-2.3 |
Defined in Control.Monad.Select Methods fmap :: (a -> b) -> LiftingSelect t m a -> LiftingSelect t m b # (<$) :: a -> LiftingSelect t m b -> LiftingSelect t m a # | |
Functor (Union r mWoven) | |
Functor (Weaving e m) | |
Functor (NonDetC m) | |
Defined in Polysemy.NonDet | |
Functor (CopastroSum p a) | |
Defined in Data.Profunctor.Choice Methods fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b # (<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 # | |
Functor (CotambaraSum p a) | |
Defined in Data.Profunctor.Choice Methods fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b # (<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 # | |
Functor (PastroSum p a) | |
Profunctor p => Functor (TambaraSum p a) | |
Defined in Data.Profunctor.Choice Methods fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b # (<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 # | |
Profunctor p => Functor (Coprep p) | |
Profunctor p => Functor (Prep p) | |
Functor (K a :: Type -> Type) | |
Functor (Tagged s) | |
(Functor f, Functor g) => Functor (These1 f g) | |
Functor f => Functor (Backwards f) | Derived instance. |
Functor m => Functor (AccumT w m) | |
Functor m => Functor (ExceptT e m) | |
Functor m => Functor (IdentityT m) | |
Functor m => Functor (ReaderT r m) | |
Functor m => Functor (SelectT r m) | |
Functor m => Functor (StateT s m) | |
Functor m => Functor (StateT s m) | |
Functor m => Functor (WriterT w m) | |
Functor m => Functor (WriterT w m) | |
Functor m => Functor (WriterT w m) | |
Functor (Constant a :: Type -> Type) | |
Functor f => Functor (Reverse f) | Derived instance. |
Functor ((,,) a b) | @since base-4.14.0.0 |
Defined in GHC.Internal.Base | |
(Functor f, Functor g) => Functor (Product f g) | Since: base-4.9.0.0 |
(Functor f, Functor g) => Functor (Sum f g) | Since: base-4.9.0.0 |
Functor (ConduitT i o m) | |
Functor (ZipConduit i o m) | |
Defined in Data.Conduit.Internal.Conduit Methods fmap :: (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b # (<$) :: a -> ZipConduit i o m b -> ZipConduit i o m a # | |
Functor f => Functor (WhenMatched f x y) | Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # (<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Functor (WhenMissing f k x) | Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b # (<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a # | |
Functor (Exchange a b s) | |
Functor (Market a b s) | |
Functor f => Functor (WhenMatched f x y) | Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # (<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Functor f, Functor g) => Functor (f :*: g) | @since base-4.9.0.0 |
(Functor f, Functor g) => Functor (f :+: g) | @since base-4.9.0.0 |
Functor (K1 i c :: Type -> Type) | @since base-4.9.0.0 |
Functor (Bazaar p a b) | |
Functor (Bazaar1 p a b) | |
Functor (Pretext p a b) | |
Functor (Exchange a b s) | |
Functor (Magma i t b) | |
Functor (Molten i a b) | |
Functor (Market a b s) | |
Functor (k (Err e s)) => Functor (FocusingErr e k s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b # (<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a # | |
Functor (k (f s)) => Functor (FocusingOn f k s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b # (<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a # | |
Functor (k (s, w)) => Functor (FocusingPlus w k s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b # (<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a # | |
Monad m => Functor (FocusingWith w m s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b # (<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a # | |
Functor (k (Err e s)) => Functor (FocusingErr e k s) | |
Defined in Lens.Micro.Mtl.Internal Methods fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b # (<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a # | |
Functor (k (f s)) => Functor (FocusingOn f k s) | |
Defined in Lens.Micro.Mtl.Internal Methods fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b # (<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a # | |
Functor (k (s, w)) => Functor (FocusingPlus w k s) | |
Defined in Lens.Micro.Mtl.Internal Methods fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b # (<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a # | |
Monad m => Functor (FocusingWith w m s) | |
Defined in Lens.Micro.Mtl.Internal Methods fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b # (<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a # | |
Functor (ContT r m) | |
Functor ((,,,) a b c) | @since base-4.14.0.0 |
Defined in GHC.Internal.Base | |
Functor ((->) r) | @since base-2.01 |
Defined in GHC.Internal.Base | |
(Functor f, Functor g) => Functor (Compose f g) | Since: base-4.9.0.0 |
Functor (Clown f a :: Type -> Type) | |
Bifunctor p => Functor (Flip p a) | |
Functor g => Functor (Joker g a) | |
Bifunctor p => Functor (WrappedBifunctor p a) | |
Defined in Data.Bifunctor.Wrapped Methods fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b # (<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 # | |
Functor f => Functor (WhenMatched f k x y) | Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # (<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a # | |
(Functor f, Functor g) => Functor (f :.: g) | @since base-4.9.0.0 |
Functor f => Functor (M1 i c f) | @since base-4.9.0.0 |
Functor (BazaarT p g a b) | |
Functor (BazaarT1 p g a b) | |
Functor (PretextT p g a b) | |
Functor (TakingWhile p f a b) | |
Defined in Control.Lens.Internal.Magma Methods fmap :: (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 # (<$) :: a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 # | |
Functor (EffectRWS w st m s) | |
Functor (k (Freed f m s)) => Functor (FocusingFree f m k s) | |
Defined in Control.Lens.Internal.Zoom Methods fmap :: (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b # (<$) :: a -> FocusingFree f m k s b -> FocusingFree f m k s a # | |
Functor (EffectRWS w st m s) | |
Reifies s (ReifiedApplicative f) => Functor (ReflectedApplicative f s) | |
Defined in Data.Reflection Methods fmap :: (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b # (<$) :: a -> ReflectedApplicative f s b -> ReflectedApplicative f s a # | |
(Functor f, Functor g) => Functor (f :.: g) | |
Functor m => Functor (RWST r w s m) | |
Functor m => Functor (RWST r w s m) | |
Functor m => Functor (RWST r w s m) | |
Functor ((,,,,) a b c d) | @since base-4.18.0.0 |
Defined in GHC.Internal.Base | |
Monad state => Functor (Builder collection mutCollection step state err) | |
(Functor (f a), Functor (g a)) => Functor (Product f g a) | |
(Functor (f a), Functor (g a)) => Functor (Sum f g a) | |
Monad m => Functor (Pipe l i o u m) | |
Functor ((,,,,,) a b c d e) | @since base-4.18.0.0 |
Defined in GHC.Internal.Base | |
(Functor f, Bifunctor p) => Functor (Tannen f p a) | |
Profunctor p => Functor (Procompose p q a) | |
Defined in Data.Profunctor.Composition Methods fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b # (<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 # | |
Profunctor p => Functor (Rift p q a) | |
Functor ((,,,,,,) a b c d e f) | @since base-4.18.0.0 |
Defined in GHC.Internal.Base | |
(Bifunctor p, Functor g) => Functor (Biff p f g a) | |
class Applicative m => Monad (m :: Type -> Type) where #
The Monad
class defines the basic operations over a monad,
a concept from a branch of mathematics known as category theory.
From the perspective of a Haskell programmer, however, it is best to
think of a monad as an abstract datatype of actions.
Haskell's do
expressions provide a convenient syntax for writing
monadic expressions.
Instances of Monad
should satisfy the following:
- Left identity
return
a>>=
k = k a- Right identity
m
>>=
return
= m- Associativity
m
>>=
(\x -> k x>>=
h) = (m>>=
k)>>=
h
Furthermore, the Monad
and Applicative
operations should relate as follows:
The above laws imply:
and that pure
and (<*>
) satisfy the applicative functor laws.
The instances of Monad
for List
, Maybe
and IO
defined in the Prelude satisfy these laws.
Minimal complete definition
Methods
(>>=) :: m a -> (a -> m b) -> m b infixl 1 #
Sequentially compose two actions, passing any value produced by the first as an argument to the second.
'as
' can be understood as the >>=
bsdo
expression
do a <- as bs a
An alternative name for this function is 'bind', but some people may refer to it as 'flatMap', which results from it being equivialent to
\x f ->join
(fmap
f x) :: Monad m => m a -> (a -> m b) -> m b
which can be seen as mapping a value with
Monad m => m a -> m (m b)
and then 'flattening' m (m b)
to m b
using join
.
(>>) :: m a -> m b -> m b infixl 1 #
Sequentially compose two actions, discarding any value produced by the first, like sequencing operators (such as the semicolon) in imperative languages.
'as
' can be understood as the >>
bsdo
expression
do as bs
or in terms of
as(>>=)
as >>= const bs
Inject a value into the monadic type.
This function should not be different from its default implementation
as pure
. The justification for the existence of this function is
merely historic.
Instances
Monad IResult | |
Monad Parser | |
Monad Result | |
Monad Complex | Since: base-4.9.0.0 |
Monad First | Since: base-4.9.0.0 |
Monad Last | Since: base-4.9.0.0 |
Monad Max | Since: base-4.9.0.0 |
Monad Min | Since: base-4.9.0.0 |
Monad Seq | |
Monad Tree | |
Monad CryptoFailable | |
Defined in Crypto.Error.Types Methods (>>=) :: CryptoFailable a -> (a -> CryptoFailable b) -> CryptoFailable b # (>>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b # return :: a -> CryptoFailable a # | |
Monad CryptoFailable | |
Defined in Crypto.Error.Types Methods (>>=) :: CryptoFailable a -> (a -> CryptoFailable b) -> CryptoFailable b # (>>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b # return :: a -> CryptoFailable a # | |
Monad DNonEmpty | |
Monad DList | |
Monad PV | |
Monad SolverStage | |
Defined in GHC.Tc.Solver.Monad Methods (>>=) :: SolverStage a -> (a -> SolverStage b) -> SolverStage b # (>>) :: SolverStage a -> SolverStage b -> SolverStage b # return :: a -> SolverStage a # | |
Monad TcS | |
Monad NonEmpty | @since base-4.9.0.0 |
Monad STM | @since base-4.3.0.0 |
Monad Identity | @since base-4.8.0.0 |
Monad First | @since base-4.8.0.0 |
Monad Last | @since base-4.8.0.0 |
Monad Down | @since base-4.11.0.0 |
Monad Dual | @since base-4.8.0.0 |
Monad Product | @since base-4.8.0.0 |
Monad Sum | @since base-4.8.0.0 |
Monad Par1 | @since base-4.9.0.0 |
Monad P | @since base-2.01 |
Monad ReadP | @since base-2.01 |
Monad IO | @since base-2.01 |
Monad Deque | |
Monad ME | |
Monad Q | |
Monad U | |
Monad Chunk | |
Monad ComplResult | |
Monad Completion | |
Defined in Options.Applicative.Internal Methods (>>=) :: Completion a -> (a -> Completion b) -> Completion b # (>>) :: Completion a -> Completion b -> Completion b # return :: a -> Completion a # | |
Monad P | |
Monad ParserM | |
Monad ParserResult | |
Defined in Options.Applicative.Types Methods (>>=) :: ParserResult a -> (a -> ParserResult b) -> ParserResult b # (>>) :: ParserResult a -> ParserResult b -> ParserResult b # return :: a -> ParserResult a # | |
Monad ReadM | |
Monad Conversion | |
Defined in Database.PostgreSQL.Simple.Internal Methods (>>=) :: Conversion a -> (a -> Conversion b) -> Conversion b # (>>) :: Conversion a -> Conversion b -> Conversion b # return :: a -> Conversion a # | |
Monad RowParser | |
Monad Array | |
Monad SmallArray | |
Defined in Data.Primitive.SmallArray Methods (>>=) :: SmallArray a -> (a -> SmallArray b) -> SmallArray b # (>>) :: SmallArray a -> SmallArray b -> SmallArray b # return :: a -> SmallArray a # | |
Monad I | |
Monad Q | |
Monad Vector | |
Monad Stream | |
Monad Maybe | @since base-2.01 |
Monad Solo | @since base-4.15 |
Monad [] | @since base-2.01 |
Representable f => Monad (Co f) | |
Monad (Parser i) | |
Monad m => Monad (WrappedMonad m) | Since: base-4.7.0.0 |
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b # (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # return :: a -> WrappedMonad m a # | |
Monad (SetM s) | |
Monad m => Monad (CatchT m) | |
Alternative f => Monad (Cofree f) | |
Functor f => Monad (Free f) | |
ArrowApply a => Monad (ArrowMonad a) | @since base-2.01 |
Defined in GHC.Internal.Control.Arrow Methods (>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b # (>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # return :: a0 -> ArrowMonad a a0 # | |
Monad (Either e) | @since base-4.4.0.0 |
Monad (Proxy :: Type -> Type) | @since base-4.7.0.0 |
Monad (U1 :: Type -> Type) | @since base-4.9.0.0 |
Monad m => Monad (Yoneda m) | |
Monad m => Monad (KatipT m) | |
Monad m => Monad (KatipContextT m) | |
Defined in Katip.Monadic Methods (>>=) :: KatipContextT m a -> (a -> KatipContextT m b) -> KatipContextT m b # (>>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b # return :: a -> KatipContextT m a # | |
Monad m => Monad (NoLoggingT m) | |
Defined in Katip.Monadic Methods (>>=) :: NoLoggingT m a -> (a -> NoLoggingT m b) -> NoLoggingT m b # (>>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b # return :: a -> NoLoggingT m a # | |
Monad (ReifiedFold s) | |
Defined in Control.Lens.Reified Methods (>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b # (>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b # return :: a -> ReifiedFold s a # | |
Monad (ReifiedGetter s) | |
Defined in Control.Lens.Reified Methods (>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b # (>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b # return :: a -> ReifiedGetter s a # | |
Monad f => Monad (WrappedPoly f) | |
Defined in Data.MonoTraversable Methods (>>=) :: WrappedPoly f a -> (a -> WrappedPoly f b) -> WrappedPoly f b # (>>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b # return :: a -> WrappedPoly f a # | |
Monad (Spec b) | |
Monad m => Monad (ListT m) | |
Monad m => Monad (NondetT m) | |
Monad (Sem f) | |
Monad m => Monad (ResourceT m) | |
Monad (RIO env) | |
Monad m => Monad (ActionT m) | |
Monad (ScottyT m) | |
Semigroup a => Monad (These a) | |
Monad (IParser t) | |
Semigroup a => Monad (These a) | |
Monad m => Monad (MaybeT m) | |
Monoid a => Monad ((,) a) | @since base-4.9.0.0 |
(Applicative f, Monad f) => Monad (WhenMissing f x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods (>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b # (>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # return :: a -> WhenMissing f x a # | |
(Alternative f, Monad w) => Monad (CofreeT f w) | |
(Functor f, Monad m) => Monad (FreeT f m) | |
(Applicative f, Monad f) => Monad (WhenMissing f x) | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods (>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b # (>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # return :: a -> WhenMissing f x a # | |
Monad m => Monad (Kleisli m a) | @since base-4.14.0.0 |
Monad f => Monad (Ap f) | @since base-4.12.0.0 |
Monad f => Monad (Alt f) | @since base-4.8.0.0 |
Monad f => Monad (Rec1 f) | @since base-4.9.0.0 |
Monad (Indexed i a) | |
Monad (t m) => Monad (LiftingAccum t m) | Since: mtl-2.3 |
Defined in Control.Monad.Accum Methods (>>=) :: LiftingAccum t m a -> (a -> LiftingAccum t m b) -> LiftingAccum t m b # (>>) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m b # return :: a -> LiftingAccum t m a # | |
Monad (t m) => Monad (LiftingSelect t m) | Since: mtl-2.3 |
Defined in Control.Monad.Select Methods (>>=) :: LiftingSelect t m a -> (a -> LiftingSelect t m b) -> LiftingSelect t m b # (>>) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m b # return :: a -> LiftingSelect t m a # | |
Monad (NonDetC m) | |
(Monad (Rep p), Representable p) => Monad (Prep p) | |
Monad (Tagged s) | |
(Monoid w, Functor m, Monad m) => Monad (AccumT w m) | |
Monad m => Monad (ExceptT e m) | |
Monad m => Monad (IdentityT m) | |
Monad m => Monad (ReaderT r m) | |
Monad m => Monad (SelectT r m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (WriterT w m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
Monad m => Monad (Reverse m) | Derived instance. |
(Monoid a, Monoid b) => Monad ((,,) a b) | @since base-4.14.0.0 |
(Monad f, Monad g) => Monad (Product f g) | Since: base-4.9.0.0 |
Monad (ConduitT i o m) | |
(Monad f, Applicative f) => Monad (WhenMatched f x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods (>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b # (>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # return :: a -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Monad (WhenMissing f k x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods (>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b # (>>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # return :: a -> WhenMissing f k x a # | |
(Monad f, Applicative f) => Monad (WhenMatched f x y) | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods (>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b # (>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # return :: a -> WhenMatched f x y a # | |
(Monad f, Monad g) => Monad (f :*: g) | @since base-4.9.0.0 |
Monad (ContT r m) | |
(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c) | @since base-4.14.0.0 |
Monad ((->) r) | @since base-2.01 |
(Monad f, Applicative f) => Monad (WhenMatched f k x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods (>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b # (>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # return :: a -> WhenMatched f k x y a # | |
Monad f => Monad (M1 i c f) | @since base-4.9.0.0 |
Monad m => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
Monad state => Monad (Builder collection mutCollection step state err) | |
Defined in Basement.MutableBuilder Methods (>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b # (>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b # return :: a -> Builder collection mutCollection step state err a # | |
Monad m => Monad (Pipe l i o u m) | |
class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #
Monads that also support choice and failure.
Minimal complete definition
Nothing
Methods
The identity of mplus
. It should also satisfy the equations
mzero >>= f = mzero v >> mzero = mzero
The default definition is
mzero = empty
An associative operation. The default definition is
mplus = (<|>
)
Instances
MonadPlus IResult | |
MonadPlus Parser | |
MonadPlus Result | |
MonadPlus Seq | |
MonadPlus DList | |
MonadPlus STM | Takes the first non- @since base-4.3.0.0 |
MonadPlus P | @since base-2.01 |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadPlus ReadP | @since base-2.01 |
MonadPlus IO | Takes the first non-throwing @since base-4.9.0.0 |
MonadPlus Deque | |
MonadPlus Chunk | |
MonadPlus Completion | |
Defined in Options.Applicative.Internal | |
MonadPlus P | |
MonadPlus ReadM | |
MonadPlus Conversion | |
Defined in Database.PostgreSQL.Simple.Internal | |
MonadPlus Array | |
MonadPlus SmallArray | |
Defined in Data.Primitive.SmallArray | |
MonadPlus Vector | |
MonadPlus Maybe | Picks the leftmost @since base-2.01 |
MonadPlus [] | Combines lists by concatenation, starting from the empty list. @since base-2.01 |
Defined in GHC.Internal.Base | |
MonadPlus (Parser i) | |
Defined in Data.Attoparsec.Internal.Types | |
Monad m => MonadPlus (CatchT m) | |
MonadPlus v => MonadPlus (Free v) | This violates the MonadPlus laws, handle with care. |
(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a) | @since base-4.6.0.0 |
Defined in GHC.Internal.Control.Arrow | |
MonadPlus (Proxy :: Type -> Type) | @since base-4.9.0.0 |
MonadPlus (U1 :: Type -> Type) | @since base-4.9.0.0 |
MonadPlus m => MonadPlus (Yoneda m) | |
MonadPlus m => MonadPlus (KatipContextT m) | |
Defined in Katip.Monadic Methods mzero :: KatipContextT m a # mplus :: KatipContextT m a -> KatipContextT m a -> KatipContextT m a # | |
MonadPlus m => MonadPlus (NoLoggingT m) | |
Defined in Katip.Monadic | |
MonadPlus (ReifiedFold s) | |
Defined in Control.Lens.Reified | |
Monad m => MonadPlus (ListT m) | |
Monad m => MonadPlus (NondetT m) | |
Member NonDet r => MonadPlus (Sem r) | Since: polysemy-0.2.1.0 |
MonadPlus m => MonadPlus (ResourceT m) | Since 1.1.5 |
MonadUnliftIO m => MonadPlus (ActionT m) | |
Monad m => MonadPlus (MaybeT m) | |
(Functor f, MonadPlus m) => MonadPlus (FreeT f m) | |
MonadPlus m => MonadPlus (Kleisli m a) | @since base-4.14.0.0 |
MonadPlus f => MonadPlus (Ap f) | @since base-4.12.0.0 |
MonadPlus f => MonadPlus (Alt f) | @since base-4.8.0.0 |
MonadPlus f => MonadPlus (Rec1 f) | @since base-4.9.0.0 |
(Monoid w, Functor m, MonadPlus m) => MonadPlus (AccumT w m) | |
(Monad m, Monoid e) => MonadPlus (ExceptT e m) | |
MonadPlus m => MonadPlus (IdentityT m) | |
MonadPlus m => MonadPlus (ReaderT r m) | |
MonadPlus m => MonadPlus (SelectT r m) | |
MonadPlus m => MonadPlus (StateT s m) | |
MonadPlus m => MonadPlus (StateT s m) | |
(Functor m, MonadPlus m) => MonadPlus (WriterT w m) | |
(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) | |
(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) | |
MonadPlus m => MonadPlus (Reverse m) | Derived instance. |
(MonadPlus f, MonadPlus g) => MonadPlus (Product f g) | Since: base-4.9.0.0 |
(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g) | @since base-4.9.0.0 |
MonadPlus f => MonadPlus (M1 i c f) | @since base-4.9.0.0 |
(Functor m, MonadPlus m) => MonadPlus (RWST r w s m) | |
(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) | |
(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) | |
class Semigroup a => Monoid a where #
The class of monoids (types with an associative binary operation that has an identity). Instances should satisfy the following:
- Right identity
x
<>
mempty
= x- Left identity
mempty
<>
x = x- Associativity
x
(<>
(y<>
z) = (x<>
y)<>
zSemigroup
law)- Concatenation
mconcat
=foldr
(<>
)mempty
You can alternatively define mconcat
instead of mempty
, in which case the
laws are:
- Unit
mconcat
(pure
x) = x- Multiplication
mconcat
(join
xss) =mconcat
(fmap
mconcat
xss)- Subclass
mconcat
(toList
xs) =sconcat
xs
The method names refer to the monoid of lists under concatenation, but there are many other instances.
Some types can be viewed as a monoid in more than one way,
e.g. both addition and multiplication on numbers.
In such cases we often define newtype
s and make those instances
of Monoid
, e.g. Sum
and Product
.
NOTE: Semigroup
is a superclass of Monoid
since base-4.11.0.0.
Methods
Identity of mappend
Examples
>>>
"Hello world" <> mempty
"Hello world"
>>>
mempty <> [1, 2, 3]
[1,2,3]
An associative operation
NOTE: This method is redundant and has the default
implementation
since base-4.11.0.0.
Should it be implemented manually, since mappend
= (<>
)mappend
is a synonym for
(<>
), it is expected that the two functions are defined the same
way. In a future GHC release mappend
will be removed from Monoid
.
Fold a list using the monoid.
For most types, the default definition for mconcat
will be
used, but the function is included in the class definition so
that an optimized version can be provided for specific types.
>>>
mconcat ["Hello", " ", "Haskell", "!"]
"Hello Haskell!"
Instances
Monoid Series | |
Monoid Key | |
Monoid Patch | |
Monoid Pointer | |
Monoid WarningParserMonoid | |
Monoid More | |
Monoid ByteArray | Since: base-4.17.0.0 |
Monoid String | |
Monoid ByteString | |
Defined in Data.ByteString.Internal.Type Methods mempty :: ByteString # mappend :: ByteString -> ByteString -> ByteString # mconcat :: [ByteString] -> ByteString # | |
Monoid ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods mempty :: ByteString # mappend :: ByteString -> ByteString -> ByteString # mconcat :: [ByteString] -> ByteString # | |
Monoid ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods mappend :: ShortByteString -> ShortByteString -> ShortByteString # mconcat :: [ShortByteString] -> ShortByteString # | |
Monoid IntSet | |
Monoid Format | |
Monoid LabelSet | |
Monoid FastString | |
Defined in GHC.Data.FastString Methods mempty :: FastString # mappend :: FastString -> FastString -> FastString # mconcat :: [FastString] -> FastString # | |
Monoid Word64Set | |
Monoid PluginRecompile | |
Defined in GHC.Driver.Plugins Methods mappend :: PluginRecompile -> PluginRecompile -> PluginRecompile # mconcat :: [PluginRecompile] -> PluginRecompile # | |
Monoid Nablas | |
Monoid JStgStat | |
Monoid JStat | |
Monoid InsideLam | |
Monoid InterestingCxt | |
Defined in GHC.Types.Basic Methods mappend :: InterestingCxt -> InterestingCxt -> InterestingCxt # mconcat :: [InterestingCxt] -> InterestingCxt # | |
Monoid ShadowedFieldGREs | |
Monoid ShadowedGREs | |
Monoid ModuleOrigin | |
Defined in GHC.Unit.State Methods mempty :: ModuleOrigin # mappend :: ModuleOrigin -> ModuleOrigin -> ModuleOrigin # mconcat :: [ModuleOrigin] -> ModuleOrigin # | |
Monoid UnitVisibility | |
Monoid All | @since base-2.01 |
Monoid Any | @since base-2.01 |
Monoid Ordering | @since base-2.01 |
Monoid Request | |
Monoid Form | |
Monoid CookieJar | Since 1.9 |
Monoid RequestBody | |
Defined in Network.HTTP.Client.Types Methods mempty :: RequestBody # mappend :: RequestBody -> RequestBody -> RequestBody # mconcat :: [RequestBody] -> RequestBody # | |
Monoid LogStr | |
Monoid Namespace | |
Monoid PayloadSelection | |
Defined in Katip.Core Methods mappend :: PayloadSelection -> PayloadSelection -> PayloadSelection # mconcat :: [PayloadSelection] -> PayloadSelection # | |
Monoid Scribe | |
Monoid SimpleLogPayload | |
Defined in Katip.Core Methods mappend :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload # mconcat :: [SimpleLogPayload] -> SimpleLogPayload # | |
Monoid LogContexts | |
Defined in Katip.Monadic Methods mempty :: LogContexts # mappend :: LogContexts -> LogContexts -> LogContexts # mconcat :: [LogContexts] -> LogContexts # | |
Monoid Name | |
Monoid DefinedCTEs | |
Monoid Dependencies | |
Monoid SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods mempty :: SqlTemplateVariables # mappend :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # | |
Monoid Artifacts | |
Monoid Dependencies | |
Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types Methods mempty :: Dependencies # mappend :: Dependencies -> Dependencies -> Dependencies # mconcat :: [Dependencies] -> Dependencies # | |
Monoid AssertionGroup | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods mappend :: AssertionGroup -> AssertionGroup -> AssertionGroup # mconcat :: [AssertionGroup] -> AssertionGroup # | |
Monoid AssertionLog | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods mempty :: AssertionLog # mappend :: AssertionLog -> AssertionLog -> AssertionLog # mconcat :: [AssertionLog] -> AssertionLog # | |
Monoid ExtraDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mappend :: ExtraDependencies -> ExtraDependencies -> ExtraDependencies # mconcat :: [ExtraDependencies] -> ExtraDependencies # | |
Monoid HiddenArtifacts | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mappend :: HiddenArtifacts -> HiddenArtifacts -> HiddenArtifacts # mconcat :: [HiddenArtifacts] -> HiddenArtifacts # | |
Monoid HiddenDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: HiddenDependencies # mappend :: HiddenDependencies -> HiddenDependencies -> HiddenDependencies # mconcat :: [HiddenDependencies] -> HiddenDependencies # | |
Monoid MetaArguments | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: MetaArguments # mappend :: MetaArguments -> MetaArguments -> MetaArguments # mconcat :: [MetaArguments] -> MetaArguments # | |
Monoid TableMemo | |
Monoid TableMemos | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: TableMemos # mappend :: TableMemos -> TableMemos -> TableMemos # mconcat :: [TableMemos] -> TableMemos # | |
Monoid Query | |
Monoid PrefsMod | |
Monoid ParserHelp | |
Defined in Options.Applicative.Help.Types Methods mempty :: ParserHelp # mappend :: ParserHelp -> ParserHelp -> ParserHelp # mconcat :: [ParserHelp] -> ParserHelp # | |
Monoid Completer | |
Monoid ParseError | |
Defined in Options.Applicative.Types Methods mempty :: ParseError # mappend :: ParseError -> ParseError -> ParseError # mconcat :: [ParseError] -> ParseError # | |
Monoid OsString | "String-Concatenation" for |
Monoid PosixString | |
Defined in System.OsString.Internal.Types Methods mempty :: PosixString # mappend :: PosixString -> PosixString -> PosixString # mconcat :: [PosixString] -> PosixString # | |
Monoid WindowsString | |
Defined in System.OsString.Internal.Types Methods mempty :: WindowsString # mappend :: WindowsString -> WindowsString -> WindowsString # mconcat :: [WindowsString] -> WindowsString # | |
Monoid Doc | |
Monoid AnsiStyle |
|
Monoid LogFunc |
Since: rio-0.0.0.0 |
Monoid Key | |
Monoid Builder | |
Monoid StrictBuilder | |
Defined in Data.Text.Internal.StrictBuilder Methods mempty :: StrictBuilder # mappend :: StrictBuilder -> StrictBuilder -> StrictBuilder # mconcat :: [StrictBuilder] -> StrictBuilder # | |
Monoid ShortText | |
Monoid CalendarDiffDays | Additive |
Defined in Data.Time.Calendar.CalendarDiffDays Methods mappend :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays # mconcat :: [CalendarDiffDays] -> CalendarDiffDays # | |
Monoid CalendarDiffTime | Additive |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods mappend :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime # mconcat :: [CalendarDiffTime] -> CalendarDiffTime # | |
Monoid Query | |
Monoid () | @since base-2.01 |
Monoid (KeyMap v) | |
Monoid (IResult a) | |
Monoid (Parser a) | |
Monoid (Result a) | |
Monoid a => Monoid (WithJSONWarnings a) | |
Defined in Data.Aeson.WarningParser Methods mempty :: WithJSONWarnings a # mappend :: WithJSONWarnings a -> WithJSONWarnings a -> WithJSONWarnings a # mconcat :: [WithJSONWarnings a] -> WithJSONWarnings a # | |
Monoid (Comparison a) |
mempty :: Comparison a mempty = Comparison _ _ -> EQ |
Defined in Data.Functor.Contravariant Methods mempty :: Comparison a # mappend :: Comparison a -> Comparison a -> Comparison a # mconcat :: [Comparison a] -> Comparison a # | |
Monoid (Equivalence a) |
mempty :: Equivalence a mempty = Equivalence _ _ -> True |
Defined in Data.Functor.Contravariant Methods mempty :: Equivalence a # mappend :: Equivalence a -> Equivalence a -> Equivalence a # mconcat :: [Equivalence a] -> Equivalence a # | |
Monoid (Predicate a) |
mempty :: Predicate a mempty = _ -> True |
(Ord a, Bounded a) => Monoid (Max a) | Since: base-4.9.0.0 |
(Ord a, Bounded a) => Monoid (Min a) | Since: base-4.9.0.0 |
Monoid m => Monoid (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods mempty :: WrappedMonoid m # mappend :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # mconcat :: [WrappedMonoid m] -> WrappedMonoid m # | |
PrimType ty => Monoid (Block ty) | |
Monoid (CountOf ty) | |
PrimType ty => Monoid (UArray ty) | |
Monoid (IntMap a) | |
Monoid (Seq a) | |
Monoid (MergeSet a) | |
Ord a => Monoid (Set a) | |
Monoid (DList a) | |
Monoid (Bag a) | |
Monoid (Word64Map a) | |
Monoid (AnnSortKey tag) | |
Defined in GHC.Parser.Annotation Methods mempty :: AnnSortKey tag # mappend :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag # mconcat :: [AnnSortKey tag] -> AnnSortKey tag # | |
Monoid (Messages e) | |
Monoid a => Monoid (STM a) | @since base-4.17.0.0 |
Monoid a => Monoid (Identity a) | @since base-4.9.0.0 |
Monoid (First a) | @since base-2.01 |
Monoid (Last a) | @since base-2.01 |
Monoid a => Monoid (Down a) | @since base-4.11.0.0 |
Monoid a => Monoid (Dual a) | @since base-2.01 |
Monoid (Endo a) | @since base-2.01 |
Num a => Monoid (Product a) | @since base-2.01 |
Num a => Monoid (Sum a) | @since base-2.01 |
(Generic a, Monoid (Rep a ())) => Monoid (Generically a) | @since base-4.17.0.0 |
Defined in GHC.Internal.Generics Methods mempty :: Generically a # mappend :: Generically a -> Generically a -> Generically a # mconcat :: [Generically a] -> Generically a # | |
Monoid p => Monoid (Par1 p) | @since base-4.12.0.0 |
Monoid a => Monoid (IO a) | @since base-4.9.0.0 |
Monoid (Deque a) | |
Monoid (Leftmost a) | |
Monoid (Rightmost a) | |
Monoid a => Monoid (May a) | |
Monoid a => Monoid (May a) | |
Ord ref => Monoid (DefinedCTEs ref) | |
Ord ref => Monoid (Dependencies ref) | |
Monoid (ResultCache a) | |
Defined in Polysemy.Memoize Methods mempty :: ResultCache a # mappend :: ResultCache a -> ResultCache a -> ResultCache a # mconcat :: [ResultCache a] -> ResultCache a # | |
Ord ref => Monoid (DefinedCTEs ref) | |
Ord ref => Monoid (Dependencies ref) | |
Monoid a => Monoid (ME a) | |
Monoid (InfoMod a) | |
Monoid (DefaultProp a) | |
Defined in Options.Applicative.Builder.Internal Methods mempty :: DefaultProp a # mappend :: DefaultProp a -> DefaultProp a -> DefaultProp a # mconcat :: [DefaultProp a] -> DefaultProp a # | |
Semigroup a => Monoid (Chunk a) | |
Monoid (Doc a) | |
Monoid (Doc ann) |
|
Monoid (Array a) | |
Monoid (PrimArray a) | Since: primitive-0.6.4.0 |
Monoid (SmallArray a) | |
Defined in Data.Primitive.SmallArray Methods mempty :: SmallArray a # mappend :: SmallArray a -> SmallArray a -> SmallArray a # mconcat :: [SmallArray a] -> SmallArray a # | |
Monad m => Monoid (RetryPolicyM m) | |
Defined in Control.Retry Methods mempty :: RetryPolicyM m # mappend :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m # mconcat :: [RetryPolicyM m] -> RetryPolicyM m # | |
Monoid (GLogFunc msg) |
Since: rio-0.1.13.0 |
(Generic a, GMonoid (Rep a)) => Monoid (GenericSemigroupMonoid a) | |
Defined in Data.Semigroup.Generic Methods mempty :: GenericSemigroupMonoid a # mappend :: GenericSemigroupMonoid a -> GenericSemigroupMonoid a -> GenericSemigroupMonoid a # mconcat :: [GenericSemigroupMonoid a] -> GenericSemigroupMonoid a # | |
Monoid a => Monoid (I a) | Since: sop-core-0.4.0.0 |
Semigroup a => Monoid (Maybe a) | |
Monoid a => Monoid (Q a) | Since: template-haskell-2.17.0.0 |
(Hashable a, Eq a) => Monoid (HashSet a) | O(n+m) To obtain good performance, the smaller set must be presented as the first argument. Examples
|
Monoid (Vector a) | |
Prim a => Monoid (Vector a) | |
Storable a => Monoid (Vector a) | |
Semigroup a => Monoid (Maybe a) | Lift a semigroup into Since 4.11.0: constraint on inner @since base-2.01 |
Monoid a => Monoid (Solo a) | @since base-4.15 |
Monoid [a] | @since base-2.01 |
Monoid (Parser i a) | |
Monoid a => Monoid (Op a b) |
mempty :: Op a b mempty = Op _ -> mempty |
Ord k => Monoid (Map k v) | |
Monoid (UniqMap k a) | |
Monoid (Proxy s) | @since base-4.7.0.0 |
Monoid (U1 p) | @since base-4.12.0.0 |
(Contravariant f, Applicative f) => Monoid (Folding f a) | |
Monad m => Monoid (Sequenced a m) | |
Applicative f => Monoid (Traversed a f) | |
(Apply f, Applicative f) => Monoid (TraversedF a f) | |
Defined in Control.Lens.Internal.Fold Methods mempty :: TraversedF a f # mappend :: TraversedF a f -> TraversedF a f -> TraversedF a f # mconcat :: [TraversedF a f] -> TraversedF a f # | |
Monoid (f a) => Monoid (Indexing f a) |
|
Monoid (Deepening i a) | This is an illegal |
Monoid a => Monoid (Err e a) | |
Monoid (ReifiedFold s a) | |
Defined in Control.Lens.Reified Methods mempty :: ReifiedFold s a # mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a # mconcat :: [ReifiedFold s a] -> ReifiedFold s a # | |
(Stream s, Ord e) => Monoid (ParseError s e) | |
Defined in Text.Megaparsec.Error Methods mempty :: ParseError s e # mappend :: ParseError s e -> ParseError s e -> ParseError s e # mconcat :: [ParseError s e] -> ParseError s e # | |
Monoid a => Monoid (Err e a) | |
Monoid (DryRunResult b) | |
Defined in Napkin.Run.Effects.Types Methods mempty :: DryRunResult b # mappend :: DryRunResult b -> DryRunResult b -> DryRunResult b # mconcat :: [DryRunResult b] -> DryRunResult b # | |
HasBackendQueryStats backend => Monoid (QueryStats backend) | |
Defined in Napkin.Types.QueryStats Methods mempty :: QueryStats backend # mappend :: QueryStats backend -> QueryStats backend -> QueryStats backend # mconcat :: [QueryStats backend] -> QueryStats backend # | |
Monoid (Mod f a) | |
(Ord k, Monoid v) => Monoid (Bias L (OMap k v)) | Empty maps and map union. When combining two sets that share elements, the
indices of the left argument are preferred, and the values are combined with
See the asymptotics of Since: ordered-containers-0.2 |
Ord a => Monoid (Bias L (OSet a)) | Empty sets and set union. When combining two sets that share elements, the indices of the left argument are preferred. See the asymptotics of ( Since: ordered-containers-0.2 |
(Ord k, Monoid v) => Monoid (Bias R (OMap k v)) | Empty maps and map union. When combining two sets that share elements, the
indices of the right argument are preferred, and the values are combined
with See the asymptotics of Since: ordered-containers-0.2 |
Ord a => Monoid (Bias R (OSet a)) | Empty sets and set union. When combining two sets that share elements, the indices of the right argument are preferred. See the asymptotics of ( Since: ordered-containers-0.2 |
Monoid a => Monoid (Sem f a) | Since: polysemy-1.6.0.0 |
Monoid a => Monoid (RIO env a) | |
(Monad m, Monoid a) => Monoid (ActionT m a) | |
Monoid a => Monoid (ScottyT m a) | |
(Monoid a, Monoid b) => Monoid (Pair a b) | |
(Monoid a, MonadUnliftIO m) => Monoid (Conc m a) | Since: unliftio-0.2.9.0 |
(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a) | Since: unliftio-0.1.0.0 |
Defined in UnliftIO.Internals.Async Methods mempty :: Concurrently m a # mappend :: Concurrently m a -> Concurrently m a -> Concurrently m a # mconcat :: [Concurrently m a] -> Concurrently m a # | |
(Eq k, Hashable k) => Monoid (HashMap k v) | If a key occurs in both maps, the mapping from the first will be the mapping in the result. Examples
|
(Monoid a, Monoid b) => Monoid (a, b) | @since base-2.01 |
Monoid b => Monoid (a -> b) | @since base-2.01 |
Monoid a => Monoid (Const a b) | @since base-4.9.0.0 |
(Applicative f, Monoid a) => Monoid (Ap f a) | @since base-4.12.0.0 |
Alternative f => Monoid (Alt f a) | @since base-4.8.0.0 |
Monoid (f p) => Monoid (Rec1 f p) | @since base-4.12.0.0 |
Monad m => Monoid (Sequenced a m) | |
Applicative f => Monoid (Traversed a f) | |
(Monad m, Monoid r) => Monoid (Effect m r a) | |
(Applicative f, Monoid a, Monad m) => Monoid (Freed f m a) | |
Monoid (ReifiedIndexedFold i s a) | |
Defined in Control.Lens.Reified Methods mempty :: ReifiedIndexedFold i s a # mappend :: ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a # mconcat :: [ReifiedIndexedFold i s a] -> ReifiedIndexedFold i s a # | |
Monad m => Monoid (Handler e m a) | |
(Monad m, Monoid r) => Monoid (Effect m r a) | |
Reifies s (ReifiedMonoid a) => Monoid (ReflectedMonoid a s) | |
Defined in Data.Reflection Methods mempty :: ReflectedMonoid a s # mappend :: ReflectedMonoid a s -> ReflectedMonoid a s -> ReflectedMonoid a s # mconcat :: [ReflectedMonoid a s] -> ReflectedMonoid a s # | |
Monoid a => Monoid (K a b) | Since: sop-core-0.4.0.0 |
(All (Compose Monoid f) xs, All (Compose Semigroup f) xs) => Monoid (NP f xs) | Since: sop-core-0.4.0.0 |
Monoid (NP (NP f) xss) => Monoid (POP f xss) | Since: sop-core-0.4.0.0 |
(Semigroup a, Monoid a) => Monoid (Tagged s a) | |
Monoid a => Monoid (Constant a b) | |
(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c) | @since base-2.01 |
(Monoid (f a), Monoid (g a)) => Monoid (Product f g a) | Since: base-4.16.0.0 |
Monad m => Monoid (ConduitT i o m ()) | |
(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p) | @since base-4.12.0.0 |
Monoid c => Monoid (K1 i c p) | @since base-4.12.0.0 |
(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d) | @since base-2.01 |
Monoid (f (g a)) => Monoid (Compose f g a) | Since: base-4.16.0.0 |
Monoid (f (g p)) => Monoid ((f :.: g) p) | @since base-4.12.0.0 |
Monoid (f p) => Monoid (M1 i c f p) | @since base-4.12.0.0 |
Contravariant g => Monoid (BazaarT p g a b t) | |
Monoid (f (g x)) => Monoid ((f :.: g) x) | Since: sop-core-0.4.0.0 |
(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e) | @since base-2.01 |
Monad m => Monoid (Pipe l i o u m ()) | |
The class of semigroups (types with an associative binary operation).
Instances should satisfy the following:
You can alternatively define sconcat
instead of (<>
), in which case the
laws are:
@since base-4.9.0.0
Methods
(<>) :: a -> a -> a infixr 6 #
An associative operation.
Examples
>>>
[1,2,3] <> [4,5,6]
[1,2,3,4,5,6]
>>>
Just [1, 2, 3] <> Just [4, 5, 6]
Just [1,2,3,4,5,6]
>>>
putStr "Hello, " <> putStrLn "World!"
Hello, World!
Reduce a non-empty list with <>
The default definition should be sufficient, but this can be overridden for efficiency.
Examples
For the following examples, we will assume that we have:
>>>
import Data.List.NonEmpty (NonEmpty (..))
>>>
sconcat $ "Hello" :| [" ", "Haskell", "!"]
"Hello Haskell!"
>>>
sconcat $ Just [1, 2, 3] :| [Nothing, Just [4, 5, 6]]
Just [1,2,3,4,5,6]
>>>
sconcat $ Left 1 :| [Right 2, Left 3, Right 4]
Right 2
stimes :: Integral b => b -> a -> a #
Repeat a value n
times.
The default definition will raise an exception for a multiplier that is <= 0
.
This may be overridden with an implementation that is total. For monoids
it is preferred to use stimesMonoid
.
By making this a member of the class, idempotent semigroups
and monoids can upgrade this to execute in O(1) by
picking stimes =
or stimesIdempotent
stimes =
respectively.stimesIdempotentMonoid
Examples
>>>
stimes 4 [1]
[1,1,1,1]
>>>
stimes 5 (putStr "hi!")
hi!hi!hi!hi!hi!
>>>
stimes 3 (Right ":)")
Right ":)"
Instances
Semigroup Series | |
Semigroup Key | |
Semigroup Patch | |
Semigroup Pointer | |
Semigroup WarningParserMonoid | |
Semigroup More | |
Semigroup ByteArray | Since: base-4.17.0.0 |
Semigroup String | |
Semigroup ByteString | |
Defined in Data.ByteString.Internal.Type Methods (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods (<>) :: ShortByteString -> ShortByteString -> ShortByteString # sconcat :: NonEmpty ShortByteString -> ShortByteString # stimes :: Integral b => b -> ShortByteString -> ShortByteString # | |
Semigroup IntSet | Since: containers-0.5.7 |
Semigroup Format | |
Semigroup LabelSet | |
Semigroup PotentialUnifiers | |
Defined in GHC.Core.InstEnv Methods (<>) :: PotentialUnifiers -> PotentialUnifiers -> PotentialUnifiers # sconcat :: NonEmpty PotentialUnifiers -> PotentialUnifiers # stimes :: Integral b => b -> PotentialUnifiers -> PotentialUnifiers # | |
Semigroup FastString | |
Defined in GHC.Data.FastString Methods (<>) :: FastString -> FastString -> FastString # sconcat :: NonEmpty FastString -> FastString # stimes :: Integral b => b -> FastString -> FastString # | |
Semigroup Word64Set | Since: ghc-0.5.7 |
Semigroup PluginRecompile | |
Defined in GHC.Driver.Plugins Methods (<>) :: PluginRecompile -> PluginRecompile -> PluginRecompile # sconcat :: NonEmpty PluginRecompile -> PluginRecompile # stimes :: Integral b => b -> PluginRecompile -> PluginRecompile # | |
Semigroup Nablas | |
Semigroup JStgStat | |
Semigroup JStat | |
Semigroup AnnListItem | |
Defined in GHC.Parser.Annotation Methods (<>) :: AnnListItem -> AnnListItem -> AnnListItem # sconcat :: NonEmpty AnnListItem -> AnnListItem # stimes :: Integral b => b -> AnnListItem -> AnnListItem # | |
Semigroup EpAnnComments | |
Defined in GHC.Parser.Annotation Methods (<>) :: EpAnnComments -> EpAnnComments -> EpAnnComments # sconcat :: NonEmpty EpAnnComments -> EpAnnComments # stimes :: Integral b => b -> EpAnnComments -> EpAnnComments # | |
Semigroup EpaLocation | |
Defined in GHC.Parser.Annotation Methods (<>) :: EpaLocation -> EpaLocation -> EpaLocation # sconcat :: NonEmpty EpaLocation -> EpaLocation # stimes :: Integral b => b -> EpaLocation -> EpaLocation # | |
Semigroup JSOptions | |
Semigroup InsideLam | If any occurrence of an identifier is inside a lambda, then the occurrence info of that identifier marks it as occurring inside a lambda |
Semigroup InterestingCxt | If there is any |
Defined in GHC.Types.Basic Methods (<>) :: InterestingCxt -> InterestingCxt -> InterestingCxt # sconcat :: NonEmpty InterestingCxt -> InterestingCxt # stimes :: Integral b => b -> InterestingCxt -> InterestingCxt # | |
Semigroup SuccessFlag | |
Defined in GHC.Types.Basic Methods (<>) :: SuccessFlag -> SuccessFlag -> SuccessFlag # sconcat :: NonEmpty SuccessFlag -> SuccessFlag # stimes :: Integral b => b -> SuccessFlag -> SuccessFlag # | |
Semigroup ShadowedFieldGREs | |
Semigroup ShadowedGREs | |
Semigroup BufSpan | |
Semigroup ModuleOrigin | |
Defined in GHC.Unit.State Methods (<>) :: ModuleOrigin -> ModuleOrigin -> ModuleOrigin # sconcat :: NonEmpty ModuleOrigin -> ModuleOrigin # stimes :: Integral b => b -> ModuleOrigin -> ModuleOrigin # | |
Semigroup UnitVisibility | |
Semigroup Void | @since base-4.9.0.0 |
Semigroup All | @since base-4.9.0.0 |
Semigroup Any | @since base-4.9.0.0 |
Semigroup Ordering | @since base-4.9.0.0 |
Semigroup Request | |
Semigroup Form | |
Semigroup CookieJar | |
Semigroup RequestBody | |
Defined in Network.HTTP.Client.Types Methods (<>) :: RequestBody -> RequestBody -> RequestBody # sconcat :: NonEmpty RequestBody -> RequestBody # stimes :: Integral b => b -> RequestBody -> RequestBody # | |
Semigroup LogStr | |
Semigroup Namespace | |
Semigroup PayloadSelection | |
Defined in Katip.Core Methods (<>) :: PayloadSelection -> PayloadSelection -> PayloadSelection # sconcat :: NonEmpty PayloadSelection -> PayloadSelection # stimes :: Integral b => b -> PayloadSelection -> PayloadSelection # | |
Semigroup Scribe | Combine two scribes. Publishes to the left scribe if the left would permit the item and to the right scribe if the right would permit the item. Finalizers are called in sequence from left to right. |
Semigroup SimpleLogPayload | |
Defined in Katip.Core Methods (<>) :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload # sconcat :: NonEmpty SimpleLogPayload -> SimpleLogPayload # stimes :: Integral b => b -> SimpleLogPayload -> SimpleLogPayload # | |
Semigroup LogContexts | |
Defined in Katip.Monadic Methods (<>) :: LogContexts -> LogContexts -> LogContexts # sconcat :: NonEmpty LogContexts -> LogContexts # stimes :: Integral b => b -> LogContexts -> LogContexts # | |
Semigroup Pos | |
Semigroup Name | |
Semigroup SpecTableName | |
Defined in Napkin.Types.Core Methods (<>) :: SpecTableName -> SpecTableName -> SpecTableName # sconcat :: NonEmpty SpecTableName -> SpecTableName # stimes :: Integral b => b -> SpecTableName -> SpecTableName # | |
Semigroup DefinedCTEs | |
Semigroup Dependencies | |
Semigroup SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods (<>) :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # sconcat :: NonEmpty SqlTemplateVariables -> SqlTemplateVariables # stimes :: Integral b => b -> SqlTemplateVariables -> SqlTemplateVariables # | |
Semigroup Artifacts | |
Semigroup Dependencies | |
Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types Methods (<>) :: Dependencies -> Dependencies -> Dependencies # sconcat :: NonEmpty Dependencies -> Dependencies # stimes :: Integral b => b -> Dependencies -> Dependencies # | |
Semigroup AssertionGroup | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (<>) :: AssertionGroup -> AssertionGroup -> AssertionGroup # sconcat :: NonEmpty AssertionGroup -> AssertionGroup # stimes :: Integral b => b -> AssertionGroup -> AssertionGroup # | |
Semigroup AssertionLog | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (<>) :: AssertionLog -> AssertionLog -> AssertionLog # sconcat :: NonEmpty AssertionLog -> AssertionLog # stimes :: Integral b => b -> AssertionLog -> AssertionLog # | |
Semigroup ExtraDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: ExtraDependencies -> ExtraDependencies -> ExtraDependencies # sconcat :: NonEmpty ExtraDependencies -> ExtraDependencies # stimes :: Integral b => b -> ExtraDependencies -> ExtraDependencies # | |
Semigroup HiddenArtifacts | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: HiddenArtifacts -> HiddenArtifacts -> HiddenArtifacts # sconcat :: NonEmpty HiddenArtifacts -> HiddenArtifacts # stimes :: Integral b => b -> HiddenArtifacts -> HiddenArtifacts # | |
Semigroup HiddenDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: HiddenDependencies -> HiddenDependencies -> HiddenDependencies # sconcat :: NonEmpty HiddenDependencies -> HiddenDependencies # stimes :: Integral b => b -> HiddenDependencies -> HiddenDependencies # | |
Semigroup MetaArguments | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: MetaArguments -> MetaArguments -> MetaArguments # sconcat :: NonEmpty MetaArguments -> MetaArguments # stimes :: Integral b => b -> MetaArguments -> MetaArguments # | |
Semigroup TableMemo | |
Semigroup TableMemos | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: TableMemos -> TableMemos -> TableMemos # sconcat :: NonEmpty TableMemos -> TableMemos # stimes :: Integral b => b -> TableMemos -> TableMemos # | |
Semigroup AppName | |
Semigroup AuthSpecFile | |
Defined in Napkin.Spec.Types.Runtime Methods (<>) :: AuthSpecFile -> AuthSpecFile -> AuthSpecFile # sconcat :: NonEmpty AuthSpecFile -> AuthSpecFile # stimes :: Integral b => b -> AuthSpecFile -> AuthSpecFile # | |
Semigroup Query | |
Semigroup PrefsMod | |
Semigroup ParserHelp | |
Defined in Options.Applicative.Help.Types Methods (<>) :: ParserHelp -> ParserHelp -> ParserHelp # sconcat :: NonEmpty ParserHelp -> ParserHelp # stimes :: Integral b => b -> ParserHelp -> ParserHelp # | |
Semigroup Completer | |
Semigroup ParseError | |
Defined in Options.Applicative.Types Methods (<>) :: ParseError -> ParseError -> ParseError # sconcat :: NonEmpty ParseError -> ParseError # stimes :: Integral b => b -> ParseError -> ParseError # | |
Semigroup OsString | |
Semigroup PosixString | |
Defined in System.OsString.Internal.Types Methods (<>) :: PosixString -> PosixString -> PosixString # sconcat :: NonEmpty PosixString -> PosixString # stimes :: Integral b => b -> PosixString -> PosixString # | |
Semigroup WindowsString | |
Defined in System.OsString.Internal.Types Methods (<>) :: WindowsString -> WindowsString -> WindowsString # sconcat :: NonEmpty WindowsString -> WindowsString # stimes :: Integral b => b -> WindowsString -> WindowsString # | |
Semigroup Doc | |
Semigroup AnsiStyle | Keep the first decision for each of foreground color, background color, boldness, italication, and underlining. If a certain style is not set, the terminal’s default will be used. Example:
is red because the first color wins, and not bold because (or if) that’s the terminal’s default. |
Semigroup LogFunc | Perform both sets of actions per log entry. Since: rio-0.0.0.0 |
Semigroup InLowCase | |
Semigroup InSource | |
Semigroup SQLTokenStream | |
Defined in Language.SQL.SimpleSQL.Lex.LexType Methods (<>) :: SQLTokenStream -> SQLTokenStream -> SQLTokenStream # sconcat :: NonEmpty SQLTokenStream -> SQLTokenStream # stimes :: Integral b => b -> SQLTokenStream -> SQLTokenStream # | |
Semigroup Key | |
Semigroup Template | |
Semigroup Builder | |
Semigroup StrictBuilder | Concatenation of |
Defined in Data.Text.Internal.StrictBuilder Methods (<>) :: StrictBuilder -> StrictBuilder -> StrictBuilder # sconcat :: NonEmpty StrictBuilder -> StrictBuilder # stimes :: Integral b => b -> StrictBuilder -> StrictBuilder # | |
Semigroup ShortText | |
Semigroup CalendarDiffDays | Additive |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (<>) :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays # sconcat :: NonEmpty CalendarDiffDays -> CalendarDiffDays # stimes :: Integral b => b -> CalendarDiffDays -> CalendarDiffDays # | |
Semigroup CalendarDiffTime | Additive |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (<>) :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime # sconcat :: NonEmpty CalendarDiffTime -> CalendarDiffTime # stimes :: Integral b => b -> CalendarDiffTime -> CalendarDiffTime # | |
Semigroup Query | |
Semigroup () | @since base-4.9.0.0 |
Semigroup (KeyMap v) | |
Semigroup (IResult a) | |
Semigroup (Parser a) | |
Semigroup (Result a) | |
Monoid a => Semigroup (WithJSONWarnings a) | |
Defined in Data.Aeson.WarningParser Methods (<>) :: WithJSONWarnings a -> WithJSONWarnings a -> WithJSONWarnings a # sconcat :: NonEmpty (WithJSONWarnings a) -> WithJSONWarnings a # stimes :: Integral b => b -> WithJSONWarnings a -> WithJSONWarnings a # | |
Semigroup (FromMaybe b) | |
Semigroup a => Semigroup (JoinWith a) | |
Semigroup (NonEmptyDList a) | |
Semigroup (Comparison a) |
(<>) :: Comparison a -> Comparison a -> Comparison a Comparison cmp <> Comparison cmp' = Comparison a a' -> cmp a a' <> cmp a a' |
Defined in Data.Functor.Contravariant Methods (<>) :: Comparison a -> Comparison a -> Comparison a # sconcat :: NonEmpty (Comparison a) -> Comparison a # stimes :: Integral b => b -> Comparison a -> Comparison a # | |
Semigroup (Equivalence a) |
(<>) :: Equivalence a -> Equivalence a -> Equivalence a Equivalence equiv <> Equivalence equiv' = Equivalence a b -> equiv a b && equiv' a b |
Defined in Data.Functor.Contravariant Methods (<>) :: Equivalence a -> Equivalence a -> Equivalence a # sconcat :: NonEmpty (Equivalence a) -> Equivalence a # stimes :: Integral b => b -> Equivalence a -> Equivalence a # | |
Semigroup (Predicate a) |
(<>) :: Predicate a -> Predicate a -> Predicate a Predicate pred <> Predicate pred' = Predicate a -> pred a && pred' a |
Semigroup (First a) | Since: base-4.9.0.0 |
Semigroup (Last a) | Since: base-4.9.0.0 |
Ord a => Semigroup (Max a) | Since: base-4.9.0.0 |
Ord a => Semigroup (Min a) | Since: base-4.9.0.0 |
Monoid m => Semigroup (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods (<>) :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # sconcat :: NonEmpty (WrappedMonoid m) -> WrappedMonoid m # stimes :: Integral b => b -> WrappedMonoid m -> WrappedMonoid m # | |
PrimType ty => Semigroup (Block ty) | |
Semigroup (CountOf ty) | |
PrimType ty => Semigroup (UArray ty) | |
Semigroup (IntMap a) | Since: containers-0.5.7 |
Semigroup (Seq a) | Since: containers-0.5.7 |
Ord a => Semigroup (Intersection a) | |
Defined in Data.Set.Internal Methods (<>) :: Intersection a -> Intersection a -> Intersection a # sconcat :: NonEmpty (Intersection a) -> Intersection a # stimes :: Integral b => b -> Intersection a -> Intersection a # | |
Semigroup (MergeSet a) | |
Ord a => Semigroup (Set a) | Since: containers-0.5.7 |
Semigroup (DNonEmpty a) | |
Semigroup (DList a) | |
Semigroup (Bag a) | |
Semigroup (Word64Map a) | Since: ghc-0.5.7 |
Semigroup (AnnSortKey tag) | |
Defined in GHC.Parser.Annotation Methods (<>) :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag # sconcat :: NonEmpty (AnnSortKey tag) -> AnnSortKey tag # stimes :: Integral b => b -> AnnSortKey tag -> AnnSortKey tag # | |
Semigroup a => Semigroup (EpAnn a) | |
Semigroup (Messages e) | |
Semigroup (NonEmpty a) | @since base-4.9.0.0 |
Semigroup a => Semigroup (STM a) | @since base-4.17.0.0 |
Semigroup a => Semigroup (Identity a) | @since base-4.9.0.0 |
Semigroup (First a) | @since base-4.9.0.0 |
Semigroup (Last a) | @since base-4.9.0.0 |
Semigroup a => Semigroup (Down a) | @since base-4.11.0.0 |
Semigroup a => Semigroup (Dual a) | @since base-4.9.0.0 |
Semigroup (Endo a) | @since base-4.9.0.0 |
Num a => Semigroup (Product a) | @since base-4.9.0.0 |
Num a => Semigroup (Sum a) | @since base-4.9.0.0 |
(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) | @since base-4.17.0.0 |
Defined in GHC.Internal.Generics Methods (<>) :: Generically a -> Generically a -> Generically a # sconcat :: NonEmpty (Generically a) -> Generically a # stimes :: Integral b => b -> Generically a -> Generically a # | |
Semigroup p => Semigroup (Par1 p) | @since base-4.12.0.0 |
Semigroup a => Semigroup (IO a) | @since base-4.10.0.0 |
Semigroup (FromMaybe b) | |
Semigroup (Deque a) | |
Semigroup (Leftmost a) | |
Semigroup (NonEmptyDList a) | |
Defined in Control.Lens.Internal.Fold Methods (<>) :: NonEmptyDList a -> NonEmptyDList a -> NonEmptyDList a # sconcat :: NonEmpty (NonEmptyDList a) -> NonEmptyDList a # stimes :: Integral b => b -> NonEmptyDList a -> NonEmptyDList a # | |
Semigroup (Rightmost a) | |
Semigroup a => Semigroup (May a) | |
Semigroup a => Semigroup (May a) | |
(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) | |
Ord ref => Semigroup (DefinedCTEs ref) | |
Ord ref => Semigroup (Dependencies ref) | |
Semigroup (ResultCache a) | |
Defined in Polysemy.Memoize Methods (<>) :: ResultCache a -> ResultCache a -> ResultCache a # sconcat :: NonEmpty (ResultCache a) -> ResultCache a # stimes :: Integral b => b -> ResultCache a -> ResultCache a # | |
Ord ref => Semigroup (DefinedCTEs ref) | |
Ord ref => Semigroup (Dependencies ref) | |
Semigroup a => Semigroup (ME a) | |
Semigroup (InfoMod a) | |
Semigroup (DefaultProp a) | |
Defined in Options.Applicative.Builder.Internal Methods (<>) :: DefaultProp a -> DefaultProp a -> DefaultProp a # sconcat :: NonEmpty (DefaultProp a) -> DefaultProp a # stimes :: Integral b => b -> DefaultProp a -> DefaultProp a # | |
Semigroup a => Semigroup (Chunk a) | |
Semigroup (Doc a) | |
Semigroup (Doc ann) | x
|
Semigroup (Array a) | Since: primitive-0.6.3.0 |
Semigroup (PrimArray a) | Since: primitive-0.6.4.0 |
Semigroup (SmallArray a) | Since: primitive-0.6.3.0 |
Defined in Data.Primitive.SmallArray Methods (<>) :: SmallArray a -> SmallArray a -> SmallArray a # sconcat :: NonEmpty (SmallArray a) -> SmallArray a # stimes :: Integral b => b -> SmallArray a -> SmallArray a # | |
Monad m => Semigroup (RetryPolicyM m) | |
Defined in Control.Retry Methods (<>) :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m # sconcat :: NonEmpty (RetryPolicyM m) -> RetryPolicyM m # stimes :: Integral b => b -> RetryPolicyM m -> RetryPolicyM m # | |
Semigroup (GLogFunc msg) | Perform both sets of actions per log entry. Since: rio-0.1.13.0 |
(Generic a, GSemigroup (Rep a)) => Semigroup (GenericSemigroupMonoid a) | |
Defined in Data.Semigroup.Generic Methods (<>) :: GenericSemigroupMonoid a -> GenericSemigroupMonoid a -> GenericSemigroupMonoid a # sconcat :: NonEmpty (GenericSemigroupMonoid a) -> GenericSemigroupMonoid a # stimes :: Integral b => b -> GenericSemigroupMonoid a -> GenericSemigroupMonoid a # | |
Semigroup a => Semigroup (I a) | Since: sop-core-0.4.0.0 |
Semigroup a => Semigroup (Maybe a) | |
Semigroup a => Semigroup (Q a) | Since: template-haskell-2.17.0.0 |
(Hashable a, Eq a) => Semigroup (HashSet a) | O(n+m) To obtain good performance, the smaller set must be presented as the first argument. Examples
|
Semigroup (Vector a) | |
Prim a => Semigroup (Vector a) | |
Storable a => Semigroup (Vector a) | |
Semigroup a => Semigroup (Maybe a) | @since base-4.9.0.0 |
Semigroup a => Semigroup (Solo a) | @since base-4.15 |
Semigroup [a] | @since base-4.9.0.0 |
Semigroup (Parser i a) | |
Semigroup a => Semigroup (Op a b) |
(<>) :: Op a b -> Op a b -> Op a b Op f <> Op g = Op a -> f a <> g a |
Ord k => Semigroup (Map k v) | |
Semigroup (UniqMap k a) | |
Semigroup (Either a b) | @since base-4.9.0.0 |
Semigroup (Proxy s) | @since base-4.9.0.0 |
Semigroup (U1 p) | @since base-4.12.0.0 |
Semigroup (V1 p) | @since base-4.12.0.0 |
(Contravariant f, Applicative f) => Semigroup (Folding f a) | |
Monad m => Semigroup (Sequenced a m) | |
Applicative f => Semigroup (Traversed a f) | |
Apply f => Semigroup (TraversedF a f) | |
Defined in Control.Lens.Internal.Fold Methods (<>) :: TraversedF a f -> TraversedF a f -> TraversedF a f # sconcat :: NonEmpty (TraversedF a f) -> TraversedF a f # stimes :: Integral b => b -> TraversedF a f -> TraversedF a f # | |
Semigroup (f a) => Semigroup (Indexing f a) | |
Semigroup (Deepening i a) | |
Semigroup a => Semigroup (Err e a) | |
Semigroup (ReifiedFold s a) | |
Defined in Control.Lens.Reified Methods (<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a # sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a # stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a # | |
(Stream s, Ord e) => Semigroup (ParseError s e) | |
Defined in Text.Megaparsec.Error Methods (<>) :: ParseError s e -> ParseError s e -> ParseError s e # sconcat :: NonEmpty (ParseError s e) -> ParseError s e # stimes :: Integral b => b -> ParseError s e -> ParseError s e # | |
Semigroup a => Semigroup (Err e a) | |
Semigroup (Ref a) | |
Semigroup (DryRunResult b) | |
Defined in Napkin.Run.Effects.Types Methods (<>) :: DryRunResult b -> DryRunResult b -> DryRunResult b # sconcat :: NonEmpty (DryRunResult b) -> DryRunResult b # stimes :: Integral b0 => b0 -> DryRunResult b -> DryRunResult b # | |
HasBackendQueryStats backend => Semigroup (QueryStats backend) | |
Defined in Napkin.Types.QueryStats Methods (<>) :: QueryStats backend -> QueryStats backend -> QueryStats backend # sconcat :: NonEmpty (QueryStats backend) -> QueryStats backend # stimes :: Integral b => b -> QueryStats backend -> QueryStats backend # | |
Semigroup (Mod f a) | Since: optparse-applicative-0.13.0.0 |
(Ord k, Semigroup v) => Semigroup (Bias L (OMap k v)) | Uses the value-lazy variant of Since: ordered-containers-0.2 |
Ord a => Semigroup (Bias L (OSet a)) | Since: ordered-containers-0.2 |
(Ord k, Semigroup v) => Semigroup (Bias R (OMap k v)) | Uses the value-lazy variant of Since: ordered-containers-0.2 |
Ord a => Semigroup (Bias R (OSet a)) | Since: ordered-containers-0.2 |
Semigroup a => Semigroup (Sem f a) | Since: polysemy-1.6.0.0 |
Semigroup a => Semigroup (RIO env a) | |
(Monad m, Semigroup a) => Semigroup (ActionT m a) | |
Semigroup a => Semigroup (ScottyT m a) | |
Semigroup (Either a b) | |
(Semigroup a, Semigroup b) => Semigroup (These a b) | |
(Semigroup a, Semigroup b) => Semigroup (Pair a b) | |
(Semigroup a, Semigroup b) => Semigroup (These a b) | |
(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a) | Since: unliftio-0.2.9.0 |
(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a) | Only defined by Since: unliftio-0.1.0.0 |
Defined in UnliftIO.Internals.Async Methods (<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a # sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a # stimes :: Integral b => b -> Concurrently m a -> Concurrently m a # | |
(Eq k, Hashable k) => Semigroup (HashMap k v) | If a key occurs in both maps, the mapping from the first will be the mapping in the result. Examples
|
(Semigroup a, Semigroup b) => Semigroup (a, b) | @since base-4.9.0.0 |
Semigroup b => Semigroup (a -> b) | @since base-4.9.0.0 |
Semigroup a => Semigroup (Const a b) | @since base-4.9.0.0 |
(Applicative f, Semigroup a) => Semigroup (Ap f a) | @since base-4.12.0.0 |
Alternative f => Semigroup (Alt f a) | @since base-4.9.0.0 |
Semigroup (f p) => Semigroup (Rec1 f p) | @since base-4.12.0.0 |
Monad m => Semigroup (Sequenced a m) | |
Applicative f => Semigroup (Traversed a f) | |
(Monad m, Semigroup r) => Semigroup (Effect m r a) | |
(Applicative f, Semigroup a, Monad m) => Semigroup (Freed f m a) | |
Semigroup (ReifiedIndexedFold i s a) | |
Defined in Control.Lens.Reified Methods (<>) :: ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a # sconcat :: NonEmpty (ReifiedIndexedFold i s a) -> ReifiedIndexedFold i s a # stimes :: Integral b => b -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a # | |
Monad m => Semigroup (Handler e m a) | |
(Monad m, Semigroup r) => Semigroup (Effect m r a) | |
Reifies s (ReifiedMonoid a) => Semigroup (ReflectedMonoid a s) | |
Defined in Data.Reflection Methods (<>) :: ReflectedMonoid a s -> ReflectedMonoid a s -> ReflectedMonoid a s # sconcat :: NonEmpty (ReflectedMonoid a s) -> ReflectedMonoid a s # stimes :: Integral b => b -> ReflectedMonoid a s -> ReflectedMonoid a s # | |
Semigroup a => Semigroup (K a b) | Since: sop-core-0.4.0.0 |
All (Compose Semigroup f) xs => Semigroup (NP f xs) | Since: sop-core-0.4.0.0 |
Semigroup (NP (NP f) xss) => Semigroup (POP f xss) | Since: sop-core-0.4.0.0 |
Semigroup a => Semigroup (Tagged s a) | |
Semigroup a => Semigroup (Constant a b) | |
(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c) | @since base-4.9.0.0 |
(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a) | Since: base-4.16.0.0 |
Monad m => Semigroup (ConduitT i o m ()) | |
(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) | @since base-4.12.0.0 |
Semigroup c => Semigroup (K1 i c p) | @since base-4.12.0.0 |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) | @since base-4.9.0.0 |
Semigroup (f (g a)) => Semigroup (Compose f g a) | Since: base-4.16.0.0 |
Semigroup (f (g p)) => Semigroup ((f :.: g) p) | @since base-4.12.0.0 |
Semigroup (f p) => Semigroup (M1 i c f p) | @since base-4.12.0.0 |
Contravariant g => Semigroup (BazaarT p g a b t) | |
Contravariant g => Semigroup (BazaarT1 p g a b t) | |
Semigroup (f (g x)) => Semigroup ((f :.: g) x) | Since: sop-core-0.4.0.0 |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) | @since base-4.9.0.0 |
Monad m => Semigroup (Pipe l i o u m ()) | |
class Monad m => MonadFail (m :: Type -> Type) where #
When a value is bound in do
-notation, the pattern on the left
hand side of <-
might not match. In this case, this class
provides a function to recover.
A Monad
without a MonadFail
instance may only be used in conjunction
with pattern that always match, such as newtypes, tuples, data types with
only a single data constructor, and irrefutable patterns (~pat
).
Instances of MonadFail
should satisfy the following law: fail s
should
be a left zero for >>=
,
fail s >>= f = fail s
If your Monad
is also MonadPlus
, a popular definition is
fail _ = mzero
fail s
should be an action that runs in the monad itself, not an
exception (except in instances of MonadIO
). In particular,
fail
should not be implemented in terms of error
.
@since base-4.9.0.0
Instances
MonadFail IResult | |
Defined in Data.Aeson.Types.Internal | |
MonadFail Parser | |
Defined in Data.Aeson.Types.Internal | |
MonadFail Result | |
Defined in Data.Aeson.Types.Internal | |
MonadFail DList | |
Defined in Data.DList.Internal | |
MonadFail TcS | |
Defined in GHC.Tc.Solver.Monad | |
MonadFail P | @since base-4.9.0.0 |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadFail ReadP | @since base-4.9.0.0 |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadFail IO | @since base-4.9.0.0 |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFail ME | |
Defined in Napkin.Render.PrettyPrint | |
MonadFail ReadM | |
Defined in Options.Applicative.Types | |
MonadFail Array | |
Defined in Data.Primitive.Array | |
MonadFail SmallArray | |
Defined in Data.Primitive.SmallArray Methods fail :: String -> SmallArray a # | |
MonadFail Q | |
Defined in Language.Haskell.TH.Syntax | |
MonadFail Vector | Since: vector-0.12.1.0 |
Defined in Data.Vector | |
MonadFail Stream | |
Defined in Codec.Compression.Zlib.Stream | |
MonadFail Maybe | @since base-4.9.0.0 |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFail [] | @since base-4.9.0.0 |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFail (Parser i) | |
Defined in Data.Attoparsec.Internal.Types | |
Monad m => MonadFail (CatchT m) | |
Defined in Control.Monad.Catch.Pure | |
MonadFail m => MonadFail (KatipT m) | |
Defined in Katip.Core | |
MonadFail m => MonadFail (KatipContextT m) | |
Defined in Katip.Monadic Methods fail :: String -> KatipContextT m a # | |
Member (Fail :: (Type -> Type) -> Type -> Type) r => MonadFail (Sem r) | Since: polysemy-1.1.0.0 |
Defined in Polysemy.Internal | |
MonadFail m => MonadFail (ResourceT m) | Since: resourcet-1.2.2 |
Defined in Control.Monad.Trans.Resource.Internal | |
MonadIO m => MonadFail (ActionT m) | Modeled after the behaviour in scotty < 0.20, |
Defined in Web.Scotty.Internal.Types | |
Monad m => MonadFail (MaybeT m) | |
Defined in Control.Monad.Trans.Maybe | |
(Functor f, MonadFail m) => MonadFail (FreeT f m) | |
Defined in Control.Monad.Trans.Free | |
MonadFail f => MonadFail (Ap f) | @since base-4.12.0.0 |
Defined in GHC.Internal.Data.Monoid | |
(Monoid w, MonadFail m) => MonadFail (AccumT w m) | |
Defined in Control.Monad.Trans.Accum | |
MonadFail m => MonadFail (ExceptT e m) | |
Defined in Control.Monad.Trans.Except | |
MonadFail m => MonadFail (IdentityT m) | |
Defined in Control.Monad.Trans.Identity | |
MonadFail m => MonadFail (ReaderT r m) | |
Defined in Control.Monad.Trans.Reader | |
MonadFail m => MonadFail (SelectT r m) | |
Defined in Control.Monad.Trans.Select | |
MonadFail m => MonadFail (StateT s m) | |
Defined in Control.Monad.Trans.State.Lazy | |
MonadFail m => MonadFail (StateT s m) | |
Defined in Control.Monad.Trans.State.Strict | |
MonadFail m => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.CPS | |
(Monoid w, MonadFail m) => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
(Monoid w, MonadFail m) => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Strict | |
MonadFail m => MonadFail (Reverse m) | |
Defined in Data.Functor.Reverse | |
MonadFail m => MonadFail (ConduitT i o m) | Since: conduit-1.3.1 |
Defined in Data.Conduit.Internal.Conduit | |
MonadFail m => MonadFail (ContT r m) | |
Defined in Control.Monad.Trans.Cont | |
MonadFail m => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.CPS | |
(Monoid w, MonadFail m) => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Lazy | |
(Monoid w, MonadFail m) => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Strict |
The Const
functor.
Examples
>>>
fmap (++ "World") (Const "Hello")
Const "Hello"
Because we ignore the second type parameter to Const
,
the Applicative instance, which has
essentially turns into (<*>)
:: Monoid m => Const m (a -> b) -> Const m a -> Const m bMonoid m => m -> m -> m
, which is (<>)
>>>
Const [1, 2, 3] <*> Const [4, 5, 6]
Const [1,2,3,4,5,6]
Instances
Generic1 (Const a :: k -> Type) | |||||
Defined in GHC.Internal.Data.Functor.Const Associated Types
| |||||
FoldableWithIndex Void (Const e :: Type -> Type) | |||||
Defined in WithIndex | |||||
FunctorWithIndex Void (Const e :: Type -> Type) | |||||
TraversableWithIndex Void (Const e :: Type -> Type) | |||||
Unbox a => Vector Vector (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s (Const a b) -> ST s (Vector (Const a b)) # basicUnsafeThaw :: Vector (Const a b) -> ST s (Mutable Vector s (Const a b)) # basicLength :: Vector (Const a b) -> Int # basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b) # basicUnsafeIndexM :: Vector (Const a b) -> Int -> Box (Const a b) # basicUnsafeCopy :: Mutable Vector s (Const a b) -> Vector (Const a b) -> ST s () # | |||||
Unbox a => MVector MVector (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s (Const a b) -> Int # basicUnsafeSlice :: Int -> Int -> MVector s (Const a b) -> MVector s (Const a b) # basicOverlaps :: MVector s (Const a b) -> MVector s (Const a b) -> Bool # basicUnsafeNew :: Int -> ST s (MVector s (Const a b)) # basicInitialize :: MVector s (Const a b) -> ST s () # basicUnsafeReplicate :: Int -> Const a b -> ST s (MVector s (Const a b)) # basicUnsafeRead :: MVector s (Const a b) -> Int -> ST s (Const a b) # basicUnsafeWrite :: MVector s (Const a b) -> Int -> Const a b -> ST s () # basicClear :: MVector s (Const a b) -> ST s () # basicSet :: MVector s (Const a b) -> Const a b -> ST s () # basicUnsafeCopy :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () # basicUnsafeMove :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () # basicUnsafeGrow :: MVector s (Const a b) -> Int -> ST s (MVector s (Const a b)) # | |||||
FromJSON2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b) # liftParseJSONList2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b] # liftOmittedField2 :: Maybe a -> Maybe b -> Maybe (Const a b) # | |||||
ToJSON2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value # liftToJSONList2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value # liftToEncoding2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding # liftToEncodingList2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding # liftOmitField2 :: (a -> Bool) -> (b -> Bool) -> Const a b -> Bool # | |||||
Bifoldable (Const :: Type -> Type -> Type) | Since: base-4.10.0.0 | ||||
Bifoldable1 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Bifoldable1 | |||||
Bifunctor (Const :: Type -> Type -> Type) | Since: base-4.8.0.0 | ||||
Bitraversable (Const :: Type -> Type -> Type) | Since: base-4.10.0.0 | ||||
Defined in Data.Bitraversable Methods bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) # | |||||
Eq2 (Const :: Type -> Type -> Type) | Since: base-4.9.0.0 | ||||
Ord2 (Const :: Type -> Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read2 (Const :: Type -> Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes Methods liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) # liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] # liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) # liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] # | |||||
Show2 (Const :: Type -> Type -> Type) | Since: base-4.9.0.0 | ||||
NFData2 (Const :: Type -> Type -> Type) | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Hashable2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Hashable.Class | |||||
FromJSON a => FromJSON1 (Const a :: Type -> Type) | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON a => ToJSON1 (Const a :: Type -> Type) | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value # liftToJSONList :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value # liftToEncoding :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding # liftToEncodingList :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding # liftOmitField :: (a0 -> Bool) -> Const a a0 -> Bool # | |||||
Eq a => Eq1 (Const a :: Type -> Type) | Since: base-4.9.0.0 | ||||
Ord a => Ord1 (Const a :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read a => Read1 (Const a :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) # liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] # liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) # liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] # | |||||
Show a => Show1 (Const a :: Type -> Type) | Since: base-4.9.0.0 | ||||
Contravariant (Const a :: Type -> Type) | |||||
NFData a => NFData1 (Const a :: Type -> Type) | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Monoid m => Applicative (Const m :: Type -> Type) | @since base-2.0.1 | ||||
Functor (Const m :: Type -> Type) | @since base-2.01 | ||||
Foldable (Const m :: Type -> Type) | @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods fold :: Monoid m0 => Const m m0 -> m0 # foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldr :: (a -> b -> b) -> b -> Const m a -> b # foldr' :: (a -> b -> b) -> b -> Const m a -> b # foldl :: (b -> a -> b) -> b -> Const m a -> b # foldl' :: (b -> a -> b) -> b -> Const m a -> b # foldr1 :: (a -> a -> a) -> Const m a -> a # foldl1 :: (a -> a -> a) -> Const m a -> a # elem :: Eq a => a -> Const m a -> Bool # maximum :: Ord a => Const m a -> a # minimum :: Ord a => Const m a -> a # | |||||
Traversable (Const m :: Type -> Type) | @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Data.Traversable | |||||
Hashable a => Hashable1 (Const a :: Type -> Type) | |||||
Defined in Data.Hashable.Class | |||||
FromJSON a => FromJSON (Const a b) | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) | |||||
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction (Const a b) # fromJSONKeyList :: FromJSONKeyFunction [Const a b] # | |||||
ToJSON a => ToJSON (Const a b) | |||||
(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
NFData a => NFData (Const a b) | Since: deepseq-1.4.0.0 | ||||
Defined in Control.DeepSeq | |||||
Monoid a => Monoid (Const a b) | @since base-4.9.0.0 | ||||
Semigroup a => Semigroup (Const a b) | @since base-4.9.0.0 | ||||
Bits a => Bits (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods (.&.) :: Const a b -> Const a b -> Const a b # (.|.) :: Const a b -> Const a b -> Const a b # xor :: Const a b -> Const a b -> Const a b # complement :: Const a b -> Const a b # shift :: Const a b -> Int -> Const a b # rotate :: Const a b -> Int -> Const a b # setBit :: Const a b -> Int -> Const a b # clearBit :: Const a b -> Int -> Const a b # complementBit :: Const a b -> Int -> Const a b # testBit :: Const a b -> Int -> Bool # bitSizeMaybe :: Const a b -> Maybe Int # isSigned :: Const a b -> Bool # shiftL :: Const a b -> Int -> Const a b # unsafeShiftL :: Const a b -> Int -> Const a b # shiftR :: Const a b -> Int -> Const a b # unsafeShiftR :: Const a b -> Int -> Const a b # rotateL :: Const a b -> Int -> Const a b # | |||||
FiniteBits a => FiniteBits (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods finiteBitSize :: Const a b -> Int # countLeadingZeros :: Const a b -> Int # countTrailingZeros :: Const a b -> Int # | |||||
(Typeable k, Data a, Typeable b) => Data (Const a b) | @since base-4.10.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) # toConstr :: Const a b -> Constr # dataTypeOf :: Const a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # | |||||
IsString a => IsString (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.String Methods fromString :: String -> Const a b # | |||||
Bounded a => Bounded (Const a b) | @since base-4.9.0.0 | ||||
Enum a => Enum (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.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] # | |||||
Floating a => Floating (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods exp :: Const a b -> Const a b # log :: Const a b -> Const a b # sqrt :: Const a b -> Const a b # (**) :: Const a b -> Const a b -> Const a b # logBase :: Const a b -> Const a b -> Const a b # sin :: Const a b -> Const a b # cos :: Const a b -> Const a b # tan :: Const a b -> Const a b # asin :: Const a b -> Const a b # acos :: Const a b -> Const a b # atan :: Const a b -> Const a b # sinh :: Const a b -> Const a b # cosh :: Const a b -> Const a b # tanh :: Const a b -> Const a b # asinh :: Const a b -> Const a b # acosh :: Const a b -> Const a b # atanh :: Const a b -> Const a b # log1p :: Const a b -> Const a b # expm1 :: Const a b -> Const a b # | |||||
RealFloat a => RealFloat (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods floatRadix :: Const a b -> Integer # floatDigits :: Const a b -> Int # floatRange :: Const a b -> (Int, Int) # decodeFloat :: Const a b -> (Integer, Int) # encodeFloat :: Integer -> Int -> Const a b # exponent :: Const a b -> Int # significand :: Const a b -> Const a b # scaleFloat :: Int -> Const a b -> Const a b # isInfinite :: Const a b -> Bool # isDenormalized :: Const a b -> Bool # isNegativeZero :: Const a b -> Bool # | |||||
Storable a => Storable (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Generic (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const Associated Types
| |||||
Ix a => Ix (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods range :: (Const a b, Const a b) -> [Const a b] # index :: (Const a b, Const a b) -> Const a b -> Int # unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int # inRange :: (Const a b, Const a b) -> Const a b -> Bool # rangeSize :: (Const a b, Const a b) -> Int # unsafeRangeSize :: (Const a b, Const a b) -> Int # | |||||
Num a => Num (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Read a => Read (Const a b) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 | ||||
Fractional a => Fractional (Const a b) | @since base-4.9.0.0 | ||||
Integral a => Integral (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods quot :: Const a b -> Const a b -> Const a b # rem :: Const a b -> Const a b -> Const a b # div :: Const a b -> Const a b -> Const a b # mod :: Const a b -> Const a b -> Const a b # quotRem :: Const a b -> Const a b -> (Const a b, Const a b) # divMod :: Const a b -> Const a b -> (Const a b, Const a b) # | |||||
Real a => Real (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const Methods toRational :: Const a b -> Rational # | |||||
RealFrac a => RealFrac (Const a b) | @since base-4.9.0.0 | ||||
Show a => Show (Const a b) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 | ||||
Eq a => Eq (Const a b) | @since base-4.9.0.0 | ||||
Ord a => Ord (Const a b) | @since base-4.9.0.0 | ||||
Hashable a => Hashable (Const a b) | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey a => FromFormKey (Const a b) | Since: http-api-data-0.4.2 | ||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey a => ToFormKey (Const a b) | Since: http-api-data-0.4.2 | ||||
Defined in Web.Internal.FormUrlEncoded | |||||
Wrapped (Const a x) | |||||
MonoFoldable (Const m a) | |||||
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 # ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b # ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 # otoList :: Const m a -> [Element (Const m a)] # oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool # oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool # olength64 :: Const m a -> Int64 # ocompareLength :: Integral i => Const m a -> i -> Ordering # otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () # ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () # omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () # oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () # ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 # ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 # ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) # ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) # headEx :: Const m a -> Element (Const m a) # lastEx :: Const m a -> Element (Const m a) # unsafeHead :: Const m a -> Element (Const m a) # unsafeLast :: Const m a -> Element (Const m a) # maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) # minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) # | |||||
MonoFunctor (Const m a) | |||||
Monoid m => MonoPointed (Const m a) | |||||
MonoTraversable (Const m a) | |||||
Pretty a => Pretty (Const a b) | |||||
Defined in Prettyprinter.Internal | |||||
Unbox a => Unbox (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base | |||||
t ~ Const a' x' => Rewrapped (Const a x) t | |||||
Defined in Control.Lens.Wrapped | |||||
type Rep1 (Const a :: k -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const | |||||
newtype MVector s (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base | |||||
type Rep (Const a b) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Functor.Const | |||||
type Unwrapped (Const a x) | |||||
Defined in Control.Lens.Wrapped | |||||
type Element (Const m a) | |||||
Defined in Data.MonoTraversable | |||||
newtype Vector (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base |
Class Enum
defines operations on sequentially ordered types.
The enumFrom
... methods are used in Haskell's translation of
arithmetic sequences.
Instances of Enum
may be derived for any enumeration type (types
whose constructors have no fields). The nullary constructors are
assumed to be numbered left-to-right by fromEnum
from 0
through n-1
.
See Chapter 10 of the Haskell Report for more details.
For any type that is an instance of class Bounded
as well as Enum
,
the following should hold:
- The calls
andsucc
maxBound
should result in a runtime error.pred
minBound
fromEnum
andtoEnum
should give a runtime error if the result value is not representable in the result type. For example,
is an error.toEnum
7 ::Bool
enumFrom
andenumFromThen
should be defined with an implicit bound, thus:
enumFrom x = enumFromTo x maxBound enumFromThen x y = enumFromThenTo x y bound where bound | fromEnum y >= fromEnum x = maxBound | otherwise = minBound
Methods
Successor of a value. For numeric types, succ
adds 1.
Predecessor of a value. For numeric types, pred
subtracts 1.
Convert from an Int
.
Convert to an Int
.
It is implementation-dependent what fromEnum
returns when
applied to a value that is too large to fit in an Int
.
Used in Haskell's translation of [n..]
with [n..] = enumFrom n
,
a possible implementation being enumFrom n = n : enumFrom (succ n)
.
Examples
enumFrom 4 :: [Integer] = [4,5,6,7,...]
enumFrom 6 :: [Int] = [6,7,8,9,...,maxBound :: Int]
enumFromThen :: a -> a -> [a] #
Used in Haskell's translation of [n,n'..]
with [n,n'..] = enumFromThen n n'
, a possible implementation being
enumFromThen n n' = n : n' : worker (f x) (f x n')
,
worker s v = v : worker s (s v)
, x = fromEnum n' - fromEnum n
and
f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y
Examples
enumFromThen 4 6 :: [Integer] = [4,6,8,10...]
enumFromThen 6 2 :: [Int] = [6,2,-2,-6,...,minBound :: Int]
enumFromTo :: a -> a -> [a] #
Used in Haskell's translation of [n..m]
with
[n..m] = enumFromTo n m
, a possible implementation being
enumFromTo n m | n <= m = n : enumFromTo (succ n) m | otherwise = []
Examples
enumFromTo 6 10 :: [Int] = [6,7,8,9,10]
enumFromTo 42 1 :: [Integer] = []
enumFromThenTo :: a -> a -> a -> [a] #
Used in Haskell's translation of [n,n'..m]
with
[n,n'..m] = enumFromThenTo n n' m
, a possible implementation
being enumFromThenTo n n' m = worker (f x) (c x) n m
,
x = fromEnum n' - fromEnum n
, c x = bool (>=) ((x 0)
f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y
and
worker s c v m | c v m = v : worker s c (s v) m | otherwise = []
Examples
enumFromThenTo 4 2 -6 :: [Integer] = [4,2,0,-2,-4,-6]
enumFromThenTo 6 8 2 :: [Int] = []
Instances
Enum Arity | |
Defined in Data.Aeson.TH | |
Enum 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 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 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 ArgCount | |
Defined in Database.SQLite3.Bindings.Types | |
Enum CArgCount | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: CArgCount -> CArgCount # pred :: CArgCount -> CArgCount # fromEnum :: CArgCount -> Int # enumFrom :: CArgCount -> [CArgCount] # enumFromThen :: CArgCount -> CArgCount -> [CArgCount] # enumFromTo :: CArgCount -> CArgCount -> [CArgCount] # enumFromThenTo :: CArgCount -> CArgCount -> CArgCount -> [CArgCount] # | |
Enum CColumnIndex | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: CColumnIndex -> CColumnIndex # pred :: CColumnIndex -> CColumnIndex # toEnum :: Int -> CColumnIndex # fromEnum :: CColumnIndex -> Int # enumFrom :: CColumnIndex -> [CColumnIndex] # enumFromThen :: CColumnIndex -> CColumnIndex -> [CColumnIndex] # enumFromTo :: CColumnIndex -> CColumnIndex -> [CColumnIndex] # enumFromThenTo :: CColumnIndex -> CColumnIndex -> CColumnIndex -> [CColumnIndex] # | |
Enum CNumBytes | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: CNumBytes -> CNumBytes # pred :: CNumBytes -> CNumBytes # fromEnum :: CNumBytes -> Int # enumFrom :: CNumBytes -> [CNumBytes] # enumFromThen :: CNumBytes -> CNumBytes -> [CNumBytes] # enumFromTo :: CNumBytes -> CNumBytes -> [CNumBytes] # enumFromThenTo :: CNumBytes -> CNumBytes -> CNumBytes -> [CNumBytes] # | |
Enum CParamIndex | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: CParamIndex -> CParamIndex # pred :: CParamIndex -> CParamIndex # toEnum :: Int -> CParamIndex # fromEnum :: CParamIndex -> Int # enumFrom :: CParamIndex -> [CParamIndex] # enumFromThen :: CParamIndex -> CParamIndex -> [CParamIndex] # enumFromTo :: CParamIndex -> CParamIndex -> [CParamIndex] # enumFromThenTo :: CParamIndex -> CParamIndex -> CParamIndex -> [CParamIndex] # | |
Enum ColumnIndex | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: ColumnIndex -> ColumnIndex # pred :: ColumnIndex -> ColumnIndex # toEnum :: Int -> ColumnIndex # fromEnum :: ColumnIndex -> Int # enumFrom :: ColumnIndex -> [ColumnIndex] # enumFromThen :: ColumnIndex -> ColumnIndex -> [ColumnIndex] # enumFromTo :: ColumnIndex -> ColumnIndex -> [ColumnIndex] # enumFromThenTo :: ColumnIndex -> ColumnIndex -> ColumnIndex -> [ColumnIndex] # | |
Enum ParamIndex | |
Defined in Database.SQLite3.Bindings.Types Methods succ :: ParamIndex -> ParamIndex # pred :: ParamIndex -> ParamIndex # toEnum :: Int -> ParamIndex # fromEnum :: ParamIndex -> Int # enumFrom :: ParamIndex -> [ParamIndex] # enumFromThen :: ParamIndex -> ParamIndex -> [ParamIndex] # enumFromTo :: ParamIndex -> ParamIndex -> [ParamIndex] # enumFromThenTo :: ParamIndex -> ParamIndex -> ParamIndex -> [ParamIndex] # | |
Enum AOp | |
Enum Op | |
Enum UOp | |
Enum AOp | |
Enum Op | |
Enum UOp | |
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 ByteOrder | @since base-4.11.0.0 |
Defined in GHC.Internal.ByteOrder Methods succ :: ByteOrder -> ByteOrder # pred :: ByteOrder -> ByteOrder # fromEnum :: ByteOrder -> Int # enumFrom :: ByteOrder -> [ByteOrder] # enumFromThen :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromTo :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromThenTo :: ByteOrder -> ByteOrder -> ByteOrder -> [ByteOrder] # | |
Enum ClosureType | |
Defined in GHC.Internal.ClosureTypes Methods succ :: ClosureType -> ClosureType # pred :: ClosureType -> ClosureType # toEnum :: Int -> ClosureType # fromEnum :: ClosureType -> Int # enumFrom :: ClosureType -> [ClosureType] # enumFromThen :: ClosureType -> ClosureType -> [ClosureType] # enumFromTo :: ClosureType -> ClosureType -> [ClosureType] # enumFromThenTo :: ClosureType -> ClosureType -> ClosureType -> [ClosureType] # | |
Enum CBool | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CClock | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CDouble | |
Enum CFloat | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CInt | |
Enum CIntMax | |
Enum CIntPtr | |
Enum CLLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods succ :: CSUSeconds -> CSUSeconds # pred :: CSUSeconds -> CSUSeconds # toEnum :: Int -> CSUSeconds # fromEnum :: CSUSeconds -> Int # enumFrom :: CSUSeconds -> [CSUSeconds] # enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds] # | |
Enum CShort | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods succ :: CSigAtomic -> CSigAtomic # pred :: CSigAtomic -> CSigAtomic # toEnum :: Int -> CSigAtomic # fromEnum :: CSigAtomic -> Int # enumFrom :: CSigAtomic -> [CSigAtomic] # enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic] # | |
Enum CSize | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CTime | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUInt | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CULLong | |
Enum CULong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUSeconds | |
Defined in GHC.Internal.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 | |
Enum CWchar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum Associativity | @since base-4.9.0.0 |
Defined in GHC.Internal.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 | @since base-4.9.0.0 |
Defined in GHC.Internal.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 | @since base-4.9.0.0 |
Defined in GHC.Internal.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 | @since base-4.9.0.0 |
Defined in GHC.Internal.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 IOMode | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.IOMode | |
Enum Int16 | @since base-2.01 |
Defined in GHC.Internal.Int | |
Enum Int32 | @since base-2.01 |
Defined in GHC.Internal.Int | |
Enum Int64 | @since base-2.01 |
Defined in GHC.Internal.Int | |
Enum Int8 | @since base-2.01 |
Enum DoCostCentres | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods succ :: DoCostCentres -> DoCostCentres # pred :: DoCostCentres -> DoCostCentres # toEnum :: Int -> DoCostCentres # fromEnum :: DoCostCentres -> Int # enumFrom :: DoCostCentres -> [DoCostCentres] # enumFromThen :: DoCostCentres -> DoCostCentres -> [DoCostCentres] # enumFromTo :: DoCostCentres -> DoCostCentres -> [DoCostCentres] # enumFromThenTo :: DoCostCentres -> DoCostCentres -> DoCostCentres -> [DoCostCentres] # | |
Enum DoHeapProfile | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods succ :: DoHeapProfile -> DoHeapProfile # pred :: DoHeapProfile -> DoHeapProfile # toEnum :: Int -> DoHeapProfile # fromEnum :: DoHeapProfile -> Int # enumFrom :: DoHeapProfile -> [DoHeapProfile] # enumFromThen :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # enumFromTo :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # enumFromThenTo :: DoHeapProfile -> DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] # | |
Enum DoTrace | @since base-4.8.0.0 |
Enum GiveGCStats | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods succ :: GiveGCStats -> GiveGCStats # pred :: GiveGCStats -> GiveGCStats # toEnum :: Int -> GiveGCStats # fromEnum :: GiveGCStats -> Int # enumFrom :: GiveGCStats -> [GiveGCStats] # enumFromThen :: GiveGCStats -> GiveGCStats -> [GiveGCStats] # enumFromTo :: GiveGCStats -> GiveGCStats -> [GiveGCStats] # enumFromThenTo :: GiveGCStats -> GiveGCStats -> GiveGCStats -> [GiveGCStats] # | |
Enum IoSubSystem | @since base-4.9.0.0 |
Defined in GHC.Internal.RTS.Flags Methods succ :: IoSubSystem -> IoSubSystem # pred :: IoSubSystem -> IoSubSystem # toEnum :: Int -> IoSubSystem # fromEnum :: IoSubSystem -> Int # enumFrom :: IoSubSystem -> [IoSubSystem] # enumFromThen :: IoSubSystem -> IoSubSystem -> [IoSubSystem] # enumFromTo :: IoSubSystem -> IoSubSystem -> [IoSubSystem] # enumFromThenTo :: IoSubSystem -> IoSubSystem -> IoSubSystem -> [IoSubSystem] # | |
Enum CBlkCnt | |
Enum CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CCc | |
Enum CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CDev | |
Enum CFsBlkCnt | |
Defined in GHC.Internal.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 GHC.Internal.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 | |
Enum CId | |
Enum CIno | |
Enum CKey | |
Enum CMode | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CNfds | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CNlink | |
Defined in GHC.Internal.System.Posix.Types | |
Enum COff | |
Enum CPid | |
Enum CRLim | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CSpeed | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CSsize | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CTcflag | |
Enum CUid | |
Enum Fd | |
Enum GeneralCategory | @since base-2.01 |
Defined in GHC.Internal.Unicode Methods succ :: GeneralCategory -> GeneralCategory # pred :: GeneralCategory -> GeneralCategory # toEnum :: Int -> GeneralCategory # fromEnum :: GeneralCategory -> Int # enumFrom :: GeneralCategory -> [GeneralCategory] # enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory] # | |
Enum Word16 | @since base-2.01 |
Defined in GHC.Internal.Word | |
Enum Word32 | @since base-2.01 |
Defined in GHC.Internal.Word | |
Enum Word64 | @since base-2.01 |
Defined in GHC.Internal.Word | |
Enum Word8 | @since base-2.01 |
Defined in GHC.Internal.Word | |
Enum Ordering | @since base-2.01 |
Defined in GHC.Internal.Enum | |
Enum THResultType | |
Defined in GHCi.Message Methods succ :: THResultType -> THResultType # pred :: THResultType -> THResultType # toEnum :: Int -> THResultType # fromEnum :: THResultType -> Int # enumFrom :: THResultType -> [THResultType] # enumFromThen :: THResultType -> THResultType -> [THResultType] # enumFromTo :: THResultType -> THResultType -> [THResultType] # enumFromThenTo :: THResultType -> THResultType -> THResultType -> [THResultType] # | |
Enum Seconds | |
Enum IdpName | |
Enum StdMethod | |
Defined in Network.HTTP.Types.Method Methods succ :: StdMethod -> StdMethod # pred :: StdMethod -> StdMethod # fromEnum :: StdMethod -> Int # enumFrom :: StdMethod -> [StdMethod] # enumFromThen :: StdMethod -> StdMethod -> [StdMethod] # enumFromTo :: StdMethod -> StdMethod -> [StdMethod] # enumFromThenTo :: StdMethod -> StdMethod -> StdMethod -> [StdMethod] # | |
Enum Status | Be advised, that when using the "enumFrom*" family of methods or ranges in lists, it will generate all possible status codes. E.g. The statuses not included in this library will have an empty message. Since: http-types-0.7.3 |
Defined in Network.HTTP.Types.Status | |
Enum IP | |
Enum IPv4 | |
Enum IPv6 | |
Enum Severity | |
Enum Verbosity | |
Defined in Katip.Core 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 SpecFileArrayMergeStrategy # | |
Defined in Napkin.Cli.Types Methods succ :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy # pred :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy # toEnum :: Int -> SpecFileArrayMergeStrategy # fromEnum :: SpecFileArrayMergeStrategy -> Int # enumFrom :: SpecFileArrayMergeStrategy -> [SpecFileArrayMergeStrategy] # enumFromThen :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> [SpecFileArrayMergeStrategy] # enumFromTo :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> [SpecFileArrayMergeStrategy] # enumFromThenTo :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> [SpecFileArrayMergeStrategy] # | |
Enum AddedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods succ :: AddedColumnPolicy -> AddedColumnPolicy # pred :: AddedColumnPolicy -> AddedColumnPolicy # toEnum :: Int -> AddedColumnPolicy # fromEnum :: AddedColumnPolicy -> Int # enumFrom :: AddedColumnPolicy -> [AddedColumnPolicy] # enumFromThen :: AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # enumFromTo :: AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # enumFromThenTo :: AddedColumnPolicy -> AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # | |
Enum DroppedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods succ :: DroppedColumnPolicy -> DroppedColumnPolicy # pred :: DroppedColumnPolicy -> DroppedColumnPolicy # toEnum :: Int -> DroppedColumnPolicy # fromEnum :: DroppedColumnPolicy -> Int # enumFrom :: DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromThen :: DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromTo :: DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromThenTo :: DroppedColumnPolicy -> DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # | |
Enum PartitionInterval | |
Defined in Napkin.Types.BigQuery Methods succ :: PartitionInterval -> PartitionInterval # pred :: PartitionInterval -> PartitionInterval # toEnum :: Int -> PartitionInterval # fromEnum :: PartitionInterval -> Int # enumFrom :: PartitionInterval -> [PartitionInterval] # enumFromThen :: PartitionInterval -> PartitionInterval -> [PartitionInterval] # enumFromTo :: PartitionInterval -> PartitionInterval -> [PartitionInterval] # enumFromThenTo :: PartitionInterval -> PartitionInterval -> PartitionInterval -> [PartitionInterval] # | |
Enum TableKind | |
Defined in Napkin.Types.Core Methods succ :: TableKind -> TableKind # pred :: TableKind -> TableKind # fromEnum :: TableKind -> Int # enumFrom :: TableKind -> [TableKind] # enumFromThen :: TableKind -> TableKind -> [TableKind] # enumFromTo :: TableKind -> TableKind -> [TableKind] # enumFromThenTo :: TableKind -> TableKind -> TableKind -> [TableKind] # | |
Enum LogLineFormat | |
Defined in Napkin.Logging Methods succ :: LogLineFormat -> LogLineFormat # pred :: LogLineFormat -> LogLineFormat # toEnum :: Int -> LogLineFormat # fromEnum :: LogLineFormat -> Int # enumFrom :: LogLineFormat -> [LogLineFormat] # enumFromThen :: LogLineFormat -> LogLineFormat -> [LogLineFormat] # enumFromTo :: LogLineFormat -> LogLineFormat -> [LogLineFormat] # enumFromThenTo :: LogLineFormat -> LogLineFormat -> LogLineFormat -> [LogLineFormat] # | |
Enum SimpleSQLParserDialect | |
Defined in Napkin.Parse.SimpleSqlParser.Dialect Methods succ :: SimpleSQLParserDialect -> SimpleSQLParserDialect # pred :: SimpleSQLParserDialect -> SimpleSQLParserDialect # toEnum :: Int -> SimpleSQLParserDialect # fromEnum :: SimpleSQLParserDialect -> Int # enumFrom :: SimpleSQLParserDialect -> [SimpleSQLParserDialect] # enumFromThen :: SimpleSQLParserDialect -> SimpleSQLParserDialect -> [SimpleSQLParserDialect] # enumFromTo :: SimpleSQLParserDialect -> SimpleSQLParserDialect -> [SimpleSQLParserDialect] # enumFromThenTo :: SimpleSQLParserDialect -> SimpleSQLParserDialect -> SimpleSQLParserDialect -> [SimpleSQLParserDialect] # | |
Enum TableWriteStrategy | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods succ :: TableWriteStrategy -> TableWriteStrategy # pred :: TableWriteStrategy -> TableWriteStrategy # toEnum :: Int -> TableWriteStrategy # fromEnum :: TableWriteStrategy -> Int # enumFrom :: TableWriteStrategy -> [TableWriteStrategy] # enumFromThen :: TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # enumFromTo :: TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # enumFromThenTo :: TableWriteStrategy -> TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # | |
Enum RenamerSchemaOverwriteBehavior | |
Defined in Napkin.Run.Effects.Preprocessor Methods succ :: RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior # pred :: RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior # toEnum :: Int -> RenamerSchemaOverwriteBehavior # fromEnum :: RenamerSchemaOverwriteBehavior -> Int # enumFrom :: RenamerSchemaOverwriteBehavior -> [RenamerSchemaOverwriteBehavior] # enumFromThen :: RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior -> [RenamerSchemaOverwriteBehavior] # enumFromTo :: RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior -> [RenamerSchemaOverwriteBehavior] # enumFromThenTo :: RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior -> RenamerSchemaOverwriteBehavior -> [RenamerSchemaOverwriteBehavior] # | |
Enum RenamerScope | |
Defined in Napkin.Run.Effects.Preprocessor Methods succ :: RenamerScope -> RenamerScope # pred :: RenamerScope -> RenamerScope # toEnum :: Int -> RenamerScope # fromEnum :: RenamerScope -> Int # enumFrom :: RenamerScope -> [RenamerScope] # enumFromThen :: RenamerScope -> RenamerScope -> [RenamerScope] # enumFromTo :: RenamerScope -> RenamerScope -> [RenamerScope] # enumFromThenTo :: RenamerScope -> RenamerScope -> RenamerScope -> [RenamerScope] # | |
Enum SQLCTYPE | |
Defined in Database.ODBC.Internal Methods succ :: SQLCTYPE -> SQLCTYPE # pred :: SQLCTYPE -> SQLCTYPE # enumFrom :: SQLCTYPE -> [SQLCTYPE] # enumFromThen :: SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] # enumFromTo :: SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] # enumFromThenTo :: SQLCTYPE -> SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] # | |
Enum SQLSMALLINT | |
Defined in Database.ODBC.Internal Methods succ :: SQLSMALLINT -> SQLSMALLINT # pred :: SQLSMALLINT -> SQLSMALLINT # toEnum :: Int -> SQLSMALLINT # fromEnum :: SQLSMALLINT -> Int # enumFrom :: SQLSMALLINT -> [SQLSMALLINT] # enumFromThen :: SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] # enumFromTo :: SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] # enumFromThenTo :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] # | |
Enum SQLUINTEGER | |
Defined in Database.ODBC.Internal Methods succ :: SQLUINTEGER -> SQLUINTEGER # pred :: SQLUINTEGER -> SQLUINTEGER # toEnum :: Int -> SQLUINTEGER # fromEnum :: SQLUINTEGER -> Int # enumFrom :: SQLUINTEGER -> [SQLUINTEGER] # enumFromThen :: SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] # enumFromTo :: SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] # enumFromThenTo :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] # | |
Enum SQLUSMALLINT | |
Defined in Database.ODBC.Internal Methods succ :: SQLUSMALLINT -> SQLUSMALLINT # pred :: SQLUSMALLINT -> SQLUSMALLINT # toEnum :: Int -> SQLUSMALLINT # fromEnum :: SQLUSMALLINT -> Int # enumFrom :: SQLUSMALLINT -> [SQLUSMALLINT] # enumFromThen :: SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] # enumFromTo :: SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] # enumFromThenTo :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] # | |
Enum AscDesc | |
Enum MathOp | |
Defined in PostgresqlSyntax.Ast | |
Enum NullsOrder | |
Defined in PostgresqlSyntax.Ast Methods succ :: NullsOrder -> NullsOrder # pred :: NullsOrder -> NullsOrder # toEnum :: Int -> NullsOrder # fromEnum :: NullsOrder -> Int # enumFrom :: NullsOrder -> [NullsOrder] # enumFromThen :: NullsOrder -> NullsOrder -> [NullsOrder] # enumFromTo :: NullsOrder -> NullsOrder -> [NullsOrder] # enumFromThenTo :: NullsOrder -> NullsOrder -> NullsOrder -> [NullsOrder] # | |
Enum OverrideKind | |
Defined in PostgresqlSyntax.Ast Methods succ :: OverrideKind -> OverrideKind # pred :: OverrideKind -> OverrideKind # toEnum :: Int -> OverrideKind # fromEnum :: OverrideKind -> Int # enumFrom :: OverrideKind -> [OverrideKind] # enumFromThen :: OverrideKind -> OverrideKind -> [OverrideKind] # enumFromTo :: OverrideKind -> OverrideKind -> [OverrideKind] # enumFromThenTo :: OverrideKind -> OverrideKind -> OverrideKind -> [OverrideKind] # | |
Enum SubType | |
Enum TrimModifier | |
Defined in PostgresqlSyntax.Ast Methods succ :: TrimModifier -> TrimModifier # pred :: TrimModifier -> TrimModifier # toEnum :: Int -> TrimModifier # fromEnum :: TrimModifier -> Int # enumFrom :: TrimModifier -> [TrimModifier] # enumFromThen :: TrimModifier -> TrimModifier -> [TrimModifier] # enumFromTo :: TrimModifier -> TrimModifier -> [TrimModifier] # enumFromThenTo :: TrimModifier -> TrimModifier -> TrimModifier -> [TrimModifier] # | |
Enum VerbalExprBinOp | |
Defined in PostgresqlSyntax.Ast Methods succ :: VerbalExprBinOp -> VerbalExprBinOp # pred :: VerbalExprBinOp -> VerbalExprBinOp # toEnum :: Int -> VerbalExprBinOp # fromEnum :: VerbalExprBinOp -> Int # enumFrom :: VerbalExprBinOp -> [VerbalExprBinOp] # enumFromThen :: VerbalExprBinOp -> VerbalExprBinOp -> [VerbalExprBinOp] # enumFromTo :: VerbalExprBinOp -> VerbalExprBinOp -> [VerbalExprBinOp] # enumFromThenTo :: VerbalExprBinOp -> VerbalExprBinOp -> VerbalExprBinOp -> [VerbalExprBinOp] # | |
Enum Undefined | |
Defined in Relude.Debug Methods succ :: Undefined -> Undefined # pred :: Undefined -> Undefined # fromEnum :: Undefined -> Int # enumFrom :: Undefined -> [Undefined] # enumFromThen :: Undefined -> Undefined -> [Undefined] # enumFromTo :: Undefined -> Undefined -> [Undefined] # enumFromThenTo :: Undefined -> Undefined -> Undefined -> [Undefined] # | |
Enum LinkArrayElementStyle | |
Defined in Servant.Links Methods succ :: LinkArrayElementStyle -> LinkArrayElementStyle # pred :: LinkArrayElementStyle -> LinkArrayElementStyle # toEnum :: Int -> LinkArrayElementStyle # fromEnum :: LinkArrayElementStyle -> Int # enumFrom :: LinkArrayElementStyle -> [LinkArrayElementStyle] # enumFromThen :: LinkArrayElementStyle -> LinkArrayElementStyle -> [LinkArrayElementStyle] # enumFromTo :: LinkArrayElementStyle -> LinkArrayElementStyle -> [LinkArrayElementStyle] # enumFromThenTo :: LinkArrayElementStyle -> LinkArrayElementStyle -> LinkArrayElementStyle -> [LinkArrayElementStyle] # | |
Enum Leniency | |
Enum I8 | |
Enum FPFormat | |
Defined in Data.Text.Lazy.Builder.RealFloat | |
Enum Day | |
Enum Month | |
Defined in Data.Time.Calendar.Month | |
Enum Quarter | |
Enum QuarterOfYear | maps Q1..Q4 to 1..4 |
Defined in Data.Time.Calendar.Quarter Methods succ :: QuarterOfYear -> QuarterOfYear # pred :: QuarterOfYear -> QuarterOfYear # toEnum :: Int -> QuarterOfYear # fromEnum :: QuarterOfYear -> Int # enumFrom :: QuarterOfYear -> [QuarterOfYear] # enumFromThen :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromTo :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromThenTo :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # | |
Enum DayOfWeek | "Circular", so for example |
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 SchemaError | |
Defined in URI.ByteString.Types Methods succ :: SchemaError -> SchemaError # pred :: SchemaError -> SchemaError # toEnum :: Int -> SchemaError # fromEnum :: SchemaError -> Int # enumFrom :: SchemaError -> [SchemaError] # enumFromThen :: SchemaError -> SchemaError -> [SchemaError] # enumFromTo :: SchemaError -> SchemaError -> [SchemaError] # enumFromThenTo :: SchemaError -> SchemaError -> SchemaError -> [SchemaError] # | |
Enum CompressionStrategy | |
Defined in Codec.Compression.Zlib.Stream Methods succ :: CompressionStrategy -> CompressionStrategy # pred :: CompressionStrategy -> CompressionStrategy # toEnum :: Int -> CompressionStrategy # fromEnum :: CompressionStrategy -> Int # enumFrom :: CompressionStrategy -> [CompressionStrategy] # enumFromThen :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # enumFromTo :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # enumFromThenTo :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy -> [CompressionStrategy] # | |
Enum Format | |
Defined in Codec.Compression.Zlib.Stream | |
Enum Method | |
Defined in Codec.Compression.Zlib.Stream | |
Enum Integer | @since base-2.01 |
Enum Natural | @since base-4.8.0.0 |
Enum () | @since base-2.01 |
Defined in GHC.Internal.Enum | |
Enum Bool | @since base-2.01 |
Enum Char | @since base-2.01 |
Enum Int | @since base-2.01 |
Enum Levity | @since base-4.16.0.0 |
Defined in GHC.Internal.Enum | |
Enum VecCount | @since base-4.10.0.0 |
Defined in GHC.Internal.Enum | |
Enum VecElem | @since base-4.10.0.0 |
Enum Word | @since base-2.01 |
Enum a => Enum (First a) | Since: base-4.9.0.0 |
Enum a => Enum (Last a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup | |
Enum a => Enum (Max a) | Since: base-4.9.0.0 |
Enum a => Enum (Min a) | Since: base-4.9.0.0 |
Enum a => Enum (WrappedMonoid a) | Since: base-4.9.0.0 |
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] # | |
SizeValid n => Enum (Bits n) | |
Defined in Basement.Bits | |
Enum (CountOf ty) | |
Defined in Basement.Types.OffsetSize Methods succ :: CountOf ty -> CountOf ty # pred :: CountOf ty -> CountOf ty # fromEnum :: CountOf ty -> Int # enumFrom :: CountOf ty -> [CountOf ty] # enumFromThen :: CountOf ty -> CountOf ty -> [CountOf ty] # enumFromTo :: CountOf ty -> CountOf ty -> [CountOf ty] # enumFromThenTo :: CountOf ty -> CountOf ty -> CountOf ty -> [CountOf ty] # | |
Enum (Offset ty) | |
Defined in Basement.Types.OffsetSize Methods succ :: Offset ty -> Offset ty # pred :: Offset ty -> Offset ty # fromEnum :: Offset ty -> Int # enumFrom :: Offset ty -> [Offset ty] # enumFromThen :: Offset ty -> Offset ty -> [Offset ty] # enumFromTo :: Offset ty -> Offset ty -> [Offset ty] # enumFromThenTo :: Offset ty -> Offset ty -> Offset ty -> [Offset ty] # | |
Enum a => Enum (Identity a) | @since base-4.9.0.0 |
Defined in GHC.Internal.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, Bounded a, Eq a) => Enum (Down a) | Swaps @since base-4.18.0.0 |
Defined in GHC.Internal.Data.Ord | |
Integral a => Enum (Ratio a) | @since base-2.0.1 |
Enum a => Enum (Solo a) | |
Defined in GHC.Internal.Enum | |
Enum (Fixed a) | Recall that, for numeric types,
and likewise
In other words,
and similarly
This is worth bearing in mind when defining [1..10] :: [Pico] evaluates to However, this is not true. On the contrary, similarly to the above
implementations of [1.000000000000, 1.00000000001, 1.00000000002, ..., 10.000000000000] and contains Since: base-2.1 |
Enum (Proxy s) | @since base-4.7.0.0 |
Enum a => Enum (Const a b) | @since base-4.9.0.0 |
Defined in GHC.Internal.Data.Functor.Const Methods succ :: Const a b -> Const a b # pred :: Const a b -> Const a b # fromEnum :: Const a b -> Int # enumFrom :: Const a b -> [Const a b] # enumFromThen :: Const a b -> Const a b -> [Const a b] # enumFromTo :: Const a b -> Const a b -> [Const a b] # enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] # | |
Enum (f a) => Enum (Ap f a) | @since base-4.12.0.0 |
Defined in GHC.Internal.Data.Monoid | |
Enum (f a) => Enum (Alt f a) | @since base-4.8.0.0 |
a ~ b => Enum (a :~: b) | @since base-4.7.0.0 |
Defined in GHC.Internal.Data.Type.Equality Methods succ :: (a :~: b) -> a :~: b # pred :: (a :~: b) -> a :~: b # fromEnum :: (a :~: b) -> Int # enumFrom :: (a :~: b) -> [a :~: b] # enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] # | |
Enum a => Enum (Tagged s a) | |
Defined in Data.Tagged Methods succ :: Tagged s a -> Tagged s a # pred :: Tagged s a -> Tagged s a # fromEnum :: Tagged s a -> Int # enumFrom :: Tagged s a -> [Tagged s a] # enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] # enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] # enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] # | |
a ~~ b => Enum (a :~~: b) | @since base-4.10.0.0 |
Defined in GHC.Internal.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 (f (g a)) => Enum (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods succ :: Compose f g a -> Compose f g a # pred :: Compose f g a -> Compose f g a # toEnum :: Int -> Compose f g a # fromEnum :: Compose f g a -> Int # enumFrom :: Compose f g a -> [Compose f g a] # enumFromThen :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromTo :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromThenTo :: Compose f g a -> Compose f g a -> Compose f g a -> [Compose f g a] # |
16-bit signed integer type
Instances
FromJSON Int16 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Int16 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Int16 | |||||
ToJSONKey Int16 | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Int16 | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
BitOps Int16 | |||||
Defined in Basement.Bits | |||||
FiniteBitsOps Int16 | |||||
Defined in Basement.Bits | |||||
Subtractive Int16 | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Int16 | |||||
Defined in Basement.PrimType | |||||
PrimType Int16 | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Int16 -> CountOf Word8 # primShiftToBytes :: Proxy Int16 -> Int # primBaUIndex :: ByteArray# -> Offset Int16 -> Int16 # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> prim Int16 # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> Int16 -> prim () # primAddrIndex :: Addr# -> Offset Int16 -> Int16 # primAddrRead :: PrimMonad prim => Addr# -> Offset Int16 -> prim Int16 # primAddrWrite :: PrimMonad prim => Addr# -> Offset Int16 -> Int16 -> prim () # | |||||
Default Int16 | |||||
Defined in Data.Default.Class | |||||
NFData Int16 | |||||
Defined in Control.DeepSeq | |||||
Buildable Int16 | |||||
Defined in Formatting.Buildable | |||||
Outputable Int16 | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Int16 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods (.&.) :: Int16 -> Int16 -> Int16 # (.|.) :: Int16 -> Int16 -> Int16 # xor :: Int16 -> Int16 -> Int16 # complement :: Int16 -> Int16 # shift :: Int16 -> Int -> Int16 # rotate :: Int16 -> Int -> Int16 # setBit :: Int16 -> Int -> Int16 # clearBit :: Int16 -> Int -> Int16 # complementBit :: Int16 -> Int -> Int16 # testBit :: Int16 -> Int -> Bool # bitSizeMaybe :: Int16 -> Maybe Int # shiftL :: Int16 -> Int -> Int16 # unsafeShiftL :: Int16 -> Int -> Int16 # shiftR :: Int16 -> Int -> Int16 # unsafeShiftR :: Int16 -> Int -> Int16 # rotateL :: Int16 -> Int -> Int16 # | |||||
FiniteBits Int16 | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Int Methods finiteBitSize :: Int16 -> Int # countLeadingZeros :: Int16 -> Int # countTrailingZeros :: Int16 -> Int # | |||||
Data Int16 | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 # dataTypeOf :: Int16 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) # gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # | |||||
Bounded Int16 | @since base-2.01 | ||||
Enum Int16 | @since base-2.01 | ||||
Defined in GHC.Internal.Int | |||||
Ix Int16 | @since base-2.01 | ||||
Num Int16 | @since base-2.01 | ||||
Read Int16 | @since base-2.01 | ||||
Integral Int16 | @since base-2.01 | ||||
Real Int16 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods toRational :: Int16 -> Rational # | |||||
Show Int16 | @since base-2.01 | ||||
Eq Int16 | @since base-2.01 | ||||
Ord Int16 | @since base-2.01 | ||||
Hashable Int16 | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey Int16 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Int16 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToSql Int16 | Corresponds to SMALLINT type of SQL Server. | ||||
Defined in Database.ODBC.SQLServer | |||||
Pretty Int16 | |||||
Defined in Prettyprinter.Internal | |||||
Uniform Int16 | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Int16 # | |||||
UniformRange Int16 | |||||
Defined in System.Random.Internal | |||||
Unbox Int16 | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Int16 | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int16 -> (i, i) # numElements :: Ix i => UArray i Int16 -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Int16)] -> UArray i Int16 # unsafeAt :: Ix i => UArray i Int16 -> Int -> Int16 # unsafeReplace :: Ix i => UArray i Int16 -> [(Int, Int16)] -> UArray i Int16 # unsafeAccum :: Ix i => (Int16 -> e' -> Int16) -> UArray i Int16 -> [(Int, e')] -> UArray i Int16 # unsafeAccumArray :: Ix i => (Int16 -> e' -> Int16) -> Int16 -> (i, i) -> [(Int, e')] -> UArray i Int16 # | |||||
Lift Int16 | |||||
Vector Vector Int16 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Int16 -> ST s (Vector Int16) # basicUnsafeThaw :: Vector Int16 -> ST s (Mutable Vector s Int16) # basicLength :: Vector Int16 -> Int # basicUnsafeSlice :: Int -> Int -> Vector Int16 -> Vector Int16 # basicUnsafeIndexM :: Vector Int16 -> Int -> Box Int16 # basicUnsafeCopy :: Mutable Vector s Int16 -> Vector Int16 -> ST s () # | |||||
MVector MVector Int16 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Int16 -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Int16 -> MVector s Int16 # basicOverlaps :: MVector s Int16 -> MVector s Int16 -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Int16) # basicInitialize :: MVector s Int16 -> ST s () # basicUnsafeReplicate :: Int -> Int16 -> ST s (MVector s Int16) # basicUnsafeRead :: MVector s Int16 -> Int -> ST s Int16 # basicUnsafeWrite :: MVector s Int16 -> Int -> Int16 -> ST s () # basicClear :: MVector s Int16 -> ST s () # basicSet :: MVector s Int16 -> Int16 -> ST s () # basicUnsafeCopy :: MVector s Int16 -> MVector s Int16 -> ST s () # basicUnsafeMove :: MVector s Int16 -> MVector s Int16 -> ST s () # basicUnsafeGrow :: MVector s Int16 -> Int -> ST s (MVector s Int16) # | |||||
MArray (STUArray s) Int16 (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int16 -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Int16 -> ST s Int # newArray :: Ix i => (i, i) -> Int16 -> ST s (STUArray s i Int16) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) # unsafeRead :: Ix i => STUArray s i Int16 -> Int -> ST s Int16 # unsafeWrite :: Ix i => STUArray s i Int16 -> Int -> Int16 -> ST s () # | |||||
type NatNumMaxBound Int16 | |||||
Defined in Basement.Nat | |||||
type Difference Int16 | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Int16 | |||||
Defined in Basement.PrimType | |||||
newtype Vector Int16 | |||||
newtype MVector s Int16 | |||||
32-bit signed integer type
Instances
FromJSON Int32 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Int32 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Int32 | |||||
ToJSONKey Int32 | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Int32 | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
BitOps Int32 | |||||
Defined in Basement.Bits | |||||
FiniteBitsOps Int32 | |||||
Defined in Basement.Bits | |||||
Subtractive Int32 | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Int32 | |||||
Defined in Basement.PrimType | |||||
PrimType Int32 | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Int32 -> CountOf Word8 # primShiftToBytes :: Proxy Int32 -> Int # primBaUIndex :: ByteArray# -> Offset Int32 -> Int32 # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> prim Int32 # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> Int32 -> prim () # primAddrIndex :: Addr# -> Offset Int32 -> Int32 # primAddrRead :: PrimMonad prim => Addr# -> Offset Int32 -> prim Int32 # primAddrWrite :: PrimMonad prim => Addr# -> Offset Int32 -> Int32 -> prim () # | |||||
Default Int32 | |||||
Defined in Data.Default.Class | |||||
NFData Int32 | |||||
Defined in Control.DeepSeq | |||||
Buildable Int32 | |||||
Defined in Formatting.Buildable | |||||
Outputable Int32 | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Int32 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods (.&.) :: Int32 -> Int32 -> Int32 # (.|.) :: Int32 -> Int32 -> Int32 # xor :: Int32 -> Int32 -> Int32 # complement :: Int32 -> Int32 # shift :: Int32 -> Int -> Int32 # rotate :: Int32 -> Int -> Int32 # setBit :: Int32 -> Int -> Int32 # clearBit :: Int32 -> Int -> Int32 # complementBit :: Int32 -> Int -> Int32 # testBit :: Int32 -> Int -> Bool # bitSizeMaybe :: Int32 -> Maybe Int # shiftL :: Int32 -> Int -> Int32 # unsafeShiftL :: Int32 -> Int -> Int32 # shiftR :: Int32 -> Int -> Int32 # unsafeShiftR :: Int32 -> Int -> Int32 # rotateL :: Int32 -> Int -> Int32 # | |||||
FiniteBits Int32 | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Int Methods finiteBitSize :: Int32 -> Int # countLeadingZeros :: Int32 -> Int # countTrailingZeros :: Int32 -> Int # | |||||
Data Int32 | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 # dataTypeOf :: Int32 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) # gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # | |||||
Bounded Int32 | @since base-2.01 | ||||
Enum Int32 | @since base-2.01 | ||||
Defined in GHC.Internal.Int | |||||
Ix Int32 | @since base-2.01 | ||||
Num Int32 | @since base-2.01 | ||||
Read Int32 | @since base-2.01 | ||||
Integral Int32 | @since base-2.01 | ||||
Real Int32 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods toRational :: Int32 -> Rational # | |||||
Show Int32 | @since base-2.01 | ||||
Eq Int32 | @since base-2.01 | ||||
Ord Int32 | @since base-2.01 | ||||
Hashable Int32 | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey Int32 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Int32 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToSql Int32 | Corresponds to INT type of SQL Server. | ||||
Defined in Database.ODBC.SQLServer | |||||
Pretty Int32 | |||||
Defined in Prettyprinter.Internal | |||||
Uniform Int32 | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Int32 # | |||||
UniformRange Int32 | |||||
Defined in System.Random.Internal | |||||
Unbox Int32 | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Int32 | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int32 -> (i, i) # numElements :: Ix i => UArray i Int32 -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Int32)] -> UArray i Int32 # unsafeAt :: Ix i => UArray i Int32 -> Int -> Int32 # unsafeReplace :: Ix i => UArray i Int32 -> [(Int, Int32)] -> UArray i Int32 # unsafeAccum :: Ix i => (Int32 -> e' -> Int32) -> UArray i Int32 -> [(Int, e')] -> UArray i Int32 # unsafeAccumArray :: Ix i => (Int32 -> e' -> Int32) -> Int32 -> (i, i) -> [(Int, e')] -> UArray i Int32 # | |||||
Lift Int32 | |||||
Vector Vector Int32 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Int32 -> ST s (Vector Int32) # basicUnsafeThaw :: Vector Int32 -> ST s (Mutable Vector s Int32) # basicLength :: Vector Int32 -> Int # basicUnsafeSlice :: Int -> Int -> Vector Int32 -> Vector Int32 # basicUnsafeIndexM :: Vector Int32 -> Int -> Box Int32 # basicUnsafeCopy :: Mutable Vector s Int32 -> Vector Int32 -> ST s () # | |||||
MVector MVector Int32 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Int32 -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Int32 -> MVector s Int32 # basicOverlaps :: MVector s Int32 -> MVector s Int32 -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Int32) # basicInitialize :: MVector s Int32 -> ST s () # basicUnsafeReplicate :: Int -> Int32 -> ST s (MVector s Int32) # basicUnsafeRead :: MVector s Int32 -> Int -> ST s Int32 # basicUnsafeWrite :: MVector s Int32 -> Int -> Int32 -> ST s () # basicClear :: MVector s Int32 -> ST s () # basicSet :: MVector s Int32 -> Int32 -> ST s () # basicUnsafeCopy :: MVector s Int32 -> MVector s Int32 -> ST s () # basicUnsafeMove :: MVector s Int32 -> MVector s Int32 -> ST s () # basicUnsafeGrow :: MVector s Int32 -> Int -> ST s (MVector s Int32) # | |||||
MArray (STUArray s) Int32 (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int32 -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Int32 -> ST s Int # newArray :: Ix i => (i, i) -> Int32 -> ST s (STUArray s i Int32) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) # unsafeRead :: Ix i => STUArray s i Int32 -> Int -> ST s Int32 # unsafeWrite :: Ix i => STUArray s i Int32 -> Int -> Int32 -> ST s () # | |||||
type NatNumMaxBound Int32 | |||||
Defined in Basement.Nat | |||||
type Difference Int32 | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Int32 | |||||
Defined in Basement.PrimType | |||||
newtype Vector Int32 | |||||
newtype MVector s Int32 | |||||
64-bit signed integer type
Instances
FromJSON Int64 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Int64 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Int64 | |||||
ToJSONKey Int64 | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Int64 | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
BitOps Int64 | |||||
Defined in Basement.Bits | |||||
FiniteBitsOps Int64 | |||||
Defined in Basement.Bits | |||||
Subtractive Int64 | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Int64 | |||||
Defined in Basement.PrimType | |||||
PrimType Int64 | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Int64 -> CountOf Word8 # primShiftToBytes :: Proxy Int64 -> Int # primBaUIndex :: ByteArray# -> Offset Int64 -> Int64 # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> prim Int64 # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> Int64 -> prim () # primAddrIndex :: Addr# -> Offset Int64 -> Int64 # primAddrRead :: PrimMonad prim => Addr# -> Offset Int64 -> prim Int64 # primAddrWrite :: PrimMonad prim => Addr# -> Offset Int64 -> Int64 -> prim () # | |||||
Default Int64 | |||||
Defined in Data.Default.Class | |||||
NFData Int64 | |||||
Defined in Control.DeepSeq | |||||
Buildable Int64 | |||||
Defined in Formatting.Buildable | |||||
Outputable Int64 | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Int64 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods (.&.) :: Int64 -> Int64 -> Int64 # (.|.) :: Int64 -> Int64 -> Int64 # xor :: Int64 -> Int64 -> Int64 # complement :: Int64 -> Int64 # shift :: Int64 -> Int -> Int64 # rotate :: Int64 -> Int -> Int64 # setBit :: Int64 -> Int -> Int64 # clearBit :: Int64 -> Int -> Int64 # complementBit :: Int64 -> Int -> Int64 # testBit :: Int64 -> Int -> Bool # bitSizeMaybe :: Int64 -> Maybe Int # shiftL :: Int64 -> Int -> Int64 # unsafeShiftL :: Int64 -> Int -> Int64 # shiftR :: Int64 -> Int -> Int64 # unsafeShiftR :: Int64 -> Int -> Int64 # rotateL :: Int64 -> Int -> Int64 # | |||||
FiniteBits Int64 | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Int Methods finiteBitSize :: Int64 -> Int # countLeadingZeros :: Int64 -> Int # countTrailingZeros :: Int64 -> Int # | |||||
Data Int64 | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 # dataTypeOf :: Int64 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) # gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # | |||||
Bounded Int64 | @since base-2.01 | ||||
Enum Int64 | @since base-2.01 | ||||
Defined in GHC.Internal.Int | |||||
Ix Int64 | @since base-2.01 | ||||
Num Int64 | @since base-2.01 | ||||
Read Int64 | @since base-2.01 | ||||
Integral Int64 | @since base-2.01 | ||||
Real Int64 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods toRational :: Int64 -> Rational # | |||||
Show Int64 | @since base-2.01 | ||||
Eq Int64 | @since base-2.01 | ||||
Ord Int64 | @since base-2.01 | ||||
Hashable Int64 | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey Int64 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Int64 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Val Int64 | Auto-convert from | ||||
Pretty Int64 | |||||
Defined in Prettyprinter.Internal | |||||
Uniform Int64 | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Int64 # | |||||
UniformRange Int64 | |||||
Defined in System.Random.Internal | |||||
Unbox Int64 | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Int64 | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int64 -> (i, i) # numElements :: Ix i => UArray i Int64 -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Int64)] -> UArray i Int64 # unsafeAt :: Ix i => UArray i Int64 -> Int -> Int64 # unsafeReplace :: Ix i => UArray i Int64 -> [(Int, Int64)] -> UArray i Int64 # unsafeAccum :: Ix i => (Int64 -> e' -> Int64) -> UArray i Int64 -> [(Int, e')] -> UArray i Int64 # unsafeAccumArray :: Ix i => (Int64 -> e' -> Int64) -> Int64 -> (i, i) -> [(Int, e')] -> UArray i Int64 # | |||||
Lift Int64 | |||||
Vector Vector Int64 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Int64 -> ST s (Vector Int64) # basicUnsafeThaw :: Vector Int64 -> ST s (Mutable Vector s Int64) # basicLength :: Vector Int64 -> Int # basicUnsafeSlice :: Int -> Int -> Vector Int64 -> Vector Int64 # basicUnsafeIndexM :: Vector Int64 -> Int -> Box Int64 # basicUnsafeCopy :: Mutable Vector s Int64 -> Vector Int64 -> ST s () # | |||||
MVector MVector Int64 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Int64 -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Int64 -> MVector s Int64 # basicOverlaps :: MVector s Int64 -> MVector s Int64 -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Int64) # basicInitialize :: MVector s Int64 -> ST s () # basicUnsafeReplicate :: Int -> Int64 -> ST s (MVector s Int64) # basicUnsafeRead :: MVector s Int64 -> Int -> ST s Int64 # basicUnsafeWrite :: MVector s Int64 -> Int -> Int64 -> ST s () # basicClear :: MVector s Int64 -> ST s () # basicSet :: MVector s Int64 -> Int64 -> ST s () # basicUnsafeCopy :: MVector s Int64 -> MVector s Int64 -> ST s () # basicUnsafeMove :: MVector s Int64 -> MVector s Int64 -> ST s () # basicUnsafeGrow :: MVector s Int64 -> Int -> ST s (MVector s Int64) # | |||||
MArray (STUArray s) Int64 (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int64 -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Int64 -> ST s Int # newArray :: Ix i => (i, i) -> Int64 -> ST s (STUArray s i Int64) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) # unsafeRead :: Ix i => STUArray s i Int64 -> Int -> ST s Int64 # unsafeWrite :: Ix i => STUArray s i Int64 -> Int -> Int64 -> ST s () # | |||||
type NatNumMaxBound Int64 | |||||
Defined in Basement.Nat | |||||
type Difference Int64 | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Int64 | |||||
Defined in Basement.PrimType | |||||
newtype Vector Int64 | |||||
newtype MVector s Int64 | |||||
8-bit signed integer type
Instances
FromJSON Int8 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Int8 | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Int8 | |||||
ToJSONKey Int8 | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Int8 | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
BitOps Int8 | |||||
FiniteBitsOps Int8 | |||||
Subtractive Int8 | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Int8 | |||||
Defined in Basement.PrimType | |||||
PrimType Int8 | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Int8 -> CountOf Word8 # primShiftToBytes :: Proxy Int8 -> Int # primBaUIndex :: ByteArray# -> Offset Int8 -> Int8 # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> prim Int8 # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> Int8 -> prim () # primAddrIndex :: Addr# -> Offset Int8 -> Int8 # primAddrRead :: PrimMonad prim => Addr# -> Offset Int8 -> prim Int8 # primAddrWrite :: PrimMonad prim => Addr# -> Offset Int8 -> Int8 -> prim () # | |||||
Default Int8 | |||||
Defined in Data.Default.Class | |||||
NFData Int8 | |||||
Defined in Control.DeepSeq | |||||
Buildable Int8 | |||||
Defined in Formatting.Buildable | |||||
Outputable Int8 | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Int8 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods (.&.) :: Int8 -> Int8 -> Int8 # (.|.) :: Int8 -> Int8 -> Int8 # complement :: Int8 -> Int8 # shift :: Int8 -> Int -> Int8 # rotate :: Int8 -> Int -> Int8 # setBit :: Int8 -> Int -> Int8 # clearBit :: Int8 -> Int -> Int8 # complementBit :: Int8 -> Int -> Int8 # testBit :: Int8 -> Int -> Bool # bitSizeMaybe :: Int8 -> Maybe Int # shiftL :: Int8 -> Int -> Int8 # unsafeShiftL :: Int8 -> Int -> Int8 # shiftR :: Int8 -> Int -> Int8 # unsafeShiftR :: Int8 -> Int -> Int8 # rotateL :: Int8 -> Int -> Int8 # | |||||
FiniteBits Int8 | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Int Methods finiteBitSize :: Int8 -> Int # countLeadingZeros :: Int8 -> Int # countTrailingZeros :: Int8 -> Int # | |||||
Data Int8 | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 # dataTypeOf :: Int8 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) # gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # | |||||
Bounded Int8 | @since base-2.01 | ||||
Enum Int8 | @since base-2.01 | ||||
Ix Int8 | @since base-2.01 | ||||
Num Int8 | @since base-2.01 | ||||
Read Int8 | @since base-2.01 | ||||
Integral Int8 | @since base-2.01 | ||||
Real Int8 | @since base-2.01 | ||||
Defined in GHC.Internal.Int Methods toRational :: Int8 -> Rational # | |||||
Show Int8 | @since base-2.01 | ||||
Eq Int8 | @since base-2.01 | ||||
Ord Int8 | @since base-2.01 | ||||
Hashable Int8 | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey Int8 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Int8 | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Pretty Int8 | |||||
Defined in Prettyprinter.Internal | |||||
Uniform Int8 | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Int8 # | |||||
UniformRange Int8 | |||||
Defined in System.Random.Internal | |||||
Unbox Int8 | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Int8 | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int8 -> (i, i) # numElements :: Ix i => UArray i Int8 -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Int8)] -> UArray i Int8 # unsafeAt :: Ix i => UArray i Int8 -> Int -> Int8 # unsafeReplace :: Ix i => UArray i Int8 -> [(Int, Int8)] -> UArray i Int8 # unsafeAccum :: Ix i => (Int8 -> e' -> Int8) -> UArray i Int8 -> [(Int, e')] -> UArray i Int8 # unsafeAccumArray :: Ix i => (Int8 -> e' -> Int8) -> Int8 -> (i, i) -> [(Int, e')] -> UArray i Int8 # | |||||
Lift Int8 | |||||
Vector Vector Int8 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Int8 -> ST s (Vector Int8) # basicUnsafeThaw :: Vector Int8 -> ST s (Mutable Vector s Int8) # basicLength :: Vector Int8 -> Int # basicUnsafeSlice :: Int -> Int -> Vector Int8 -> Vector Int8 # basicUnsafeIndexM :: Vector Int8 -> Int -> Box Int8 # basicUnsafeCopy :: Mutable Vector s Int8 -> Vector Int8 -> ST s () # | |||||
MVector MVector Int8 | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Int8 -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Int8 -> MVector s Int8 # basicOverlaps :: MVector s Int8 -> MVector s Int8 -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Int8) # basicInitialize :: MVector s Int8 -> ST s () # basicUnsafeReplicate :: Int -> Int8 -> ST s (MVector s Int8) # basicUnsafeRead :: MVector s Int8 -> Int -> ST s Int8 # basicUnsafeWrite :: MVector s Int8 -> Int -> Int8 -> ST s () # basicClear :: MVector s Int8 -> ST s () # basicSet :: MVector s Int8 -> Int8 -> ST s () # basicUnsafeCopy :: MVector s Int8 -> MVector s Int8 -> ST s () # basicUnsafeMove :: MVector s Int8 -> MVector s Int8 -> ST s () # basicUnsafeGrow :: MVector s Int8 -> Int -> ST s (MVector s Int8) # | |||||
MArray (STUArray s) Int8 (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int8 -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Int8 -> ST s Int # newArray :: Ix i => (i, i) -> Int8 -> ST s (STUArray s i Int8) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) # unsafeRead :: Ix i => STUArray s i Int8 -> Int -> ST s Int8 # unsafeWrite :: Ix i => STUArray s i Int8 -> Int -> Int8 -> ST s () # | |||||
type NatNumMaxBound Int8 | |||||
Defined in Basement.Nat | |||||
type Difference Int8 | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Int8 | |||||
Defined in Basement.PrimType | |||||
newtype Vector Int8 | |||||
newtype MVector s Int8 | |||||
Basic numeric class.
The Haskell Report defines no laws for Num
. However, (
and +
)(
are
customarily expected to define a ring and have the following properties:*
)
- Associativity of
(
+
) (x + y) + z
=x + (y + z)
- Commutativity of
(
+
) x + y
=y + x
is the additive identityfromInteger
0x + fromInteger 0
=x
negate
gives the additive inversex + negate x
=fromInteger 0
- Associativity of
(
*
) (x * y) * z
=x * (y * z)
is the multiplicative identityfromInteger
1x * fromInteger 1
=x
andfromInteger 1 * x
=x
- Distributivity of
(
with respect to*
)(
+
) a * (b + c)
=(a * b) + (a * c)
and(b + c) * a
=(b * a) + (c * a)
- Coherence with
toInteger
- if the type also implements
Integral
, thenfromInteger
is a left inverse fortoInteger
, i.e.fromInteger (toInteger i) == i
Note that it isn't customarily expected that a type instance of both Num
and Ord
implement an ordered ring. Indeed, in base
only Integer
and
Rational
do.
Methods
Unary negation.
Absolute value.
Sign of a number.
The functions abs
and signum
should satisfy the law:
abs x * signum x == x
For real numbers, the signum
is either -1
(negative), 0
(zero)
or 1
(positive).
fromInteger :: Integer -> a #
Conversion from an Integer
.
An integer literal represents the application of the function
fromInteger
to the appropriate value of type Integer
,
so such literals have type (
.Num
a) => a
Instances
Num Pos | |
Num ArgCount | |
Defined in Database.SQLite3.Bindings.Types | |
Num CArgCount | |
Defined in Database.SQLite3.Bindings.Types | |
Num CColumnIndex | |
Defined in Database.SQLite3.Bindings.Types Methods (+) :: CColumnIndex -> CColumnIndex -> CColumnIndex # (-) :: CColumnIndex -> CColumnIndex -> CColumnIndex # (*) :: CColumnIndex -> CColumnIndex -> CColumnIndex # negate :: CColumnIndex -> CColumnIndex # abs :: CColumnIndex -> CColumnIndex # signum :: CColumnIndex -> CColumnIndex # fromInteger :: Integer -> CColumnIndex # | |
Num CNumBytes | |
Defined in Database.SQLite3.Bindings.Types | |
Num CParamIndex | |
Defined in Database.SQLite3.Bindings.Types Methods (+) :: CParamIndex -> CParamIndex -> CParamIndex # (-) :: CParamIndex -> CParamIndex -> CParamIndex # (*) :: CParamIndex -> CParamIndex -> CParamIndex # negate :: CParamIndex -> CParamIndex # abs :: CParamIndex -> CParamIndex # signum :: CParamIndex -> CParamIndex # fromInteger :: Integer -> CParamIndex # | |
Num ColumnIndex | |
Defined in Database.SQLite3.Bindings.Types Methods (+) :: ColumnIndex -> ColumnIndex -> ColumnIndex # (-) :: ColumnIndex -> ColumnIndex -> ColumnIndex # (*) :: ColumnIndex -> ColumnIndex -> ColumnIndex # negate :: ColumnIndex -> ColumnIndex # abs :: ColumnIndex -> ColumnIndex # signum :: ColumnIndex -> ColumnIndex # fromInteger :: Integer -> ColumnIndex # | |
Num ParamIndex | |
Defined in Database.SQLite3.Bindings.Types Methods (+) :: ParamIndex -> ParamIndex -> ParamIndex # (-) :: ParamIndex -> ParamIndex -> ParamIndex # (*) :: ParamIndex -> ParamIndex -> ParamIndex # negate :: ParamIndex -> ParamIndex # abs :: ParamIndex -> ParamIndex # signum :: ParamIndex -> ParamIndex # fromInteger :: Integer -> ParamIndex # | |
Num IntWithInf | |
Defined in GHC.Types.Basic Methods (+) :: IntWithInf -> IntWithInf -> IntWithInf # (-) :: IntWithInf -> IntWithInf -> IntWithInf # (*) :: IntWithInf -> IntWithInf -> IntWithInf # negate :: IntWithInf -> IntWithInf # abs :: IntWithInf -> IntWithInf # signum :: IntWithInf -> IntWithInf # fromInteger :: Integer -> IntWithInf # | |
Num SaneDouble | |
Defined in GHC.Types.SaneDouble Methods (+) :: SaneDouble -> SaneDouble -> SaneDouble # (-) :: SaneDouble -> SaneDouble -> SaneDouble # (*) :: SaneDouble -> SaneDouble -> SaneDouble # negate :: SaneDouble -> SaneDouble # abs :: SaneDouble -> SaneDouble # signum :: SaneDouble -> SaneDouble # fromInteger :: Integer -> SaneDouble # | |
Num CBool | |
Num CChar | |
Num CClock | |
Num CDouble | |
Num CFloat | |
Num CInt | |
Num CIntMax | |
Num CIntPtr | |
Num CLLong | |
Num CLong | |
Num CPtrdiff | |
Num CSChar | |
Num CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods (+) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (-) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (*) :: CSUSeconds -> CSUSeconds -> CSUSeconds # negate :: CSUSeconds -> CSUSeconds # abs :: CSUSeconds -> CSUSeconds # signum :: CSUSeconds -> CSUSeconds # fromInteger :: Integer -> CSUSeconds # | |
Num CShort | |
Num CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods (+) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (-) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (*) :: CSigAtomic -> CSigAtomic -> CSigAtomic # negate :: CSigAtomic -> CSigAtomic # abs :: CSigAtomic -> CSigAtomic # signum :: CSigAtomic -> CSigAtomic # fromInteger :: Integer -> CSigAtomic # | |
Num CSize | |
Num CTime | |
Num CUChar | |
Num CUInt | |
Num CUIntMax | |
Num CUIntPtr | |
Num CULLong | |
Num CULong | |
Num CUSeconds | |
Defined in GHC.Internal.Foreign.C.Types | |
Num CUShort | |
Num CWchar | |
Num Int16 | @since base-2.01 |
Num Int32 | @since base-2.01 |
Num Int64 | @since base-2.01 |
Num Int8 | @since base-2.01 |
Num CBlkCnt | |
Num CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Num CCc | |
Num CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Num CDev | |
Num CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Num CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Num CGid | |
Num CId | |
Num CIno | |
Num CKey | |
Num CMode | |
Num CNfds | |
Num CNlink | |
Num COff | |
Num CPid | |
Num CRLim | |
Num CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Num CSpeed | |
Num CSsize | |
Num CTcflag | |
Num CUid | |
Num Fd | |
Num Word16 | @since base-2.01 |
Num Word32 | @since base-2.01 |
Num Word64 | @since base-2.01 |
Num Word8 | @since base-2.01 |
Num Seconds | |
Num Hash | |
Num IntDate | |
Num Dollars | |
Num SQLCTYPE | |
Num SQLINTEGER | |
Defined in Database.ODBC.Internal | |
Num SQLLEN | |
Num SQLSMALLINT | |
Defined in Database.ODBC.Internal Methods (+) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT # (-) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT # (*) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT # negate :: SQLSMALLINT -> SQLSMALLINT # abs :: SQLSMALLINT -> SQLSMALLINT # signum :: SQLSMALLINT -> SQLSMALLINT # fromInteger :: Integer -> SQLSMALLINT # | |
Num SQLUINTEGER | |
Defined in Database.ODBC.Internal Methods (+) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER # (-) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER # (*) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER # negate :: SQLUINTEGER -> SQLUINTEGER # abs :: SQLUINTEGER -> SQLUINTEGER # signum :: SQLUINTEGER -> SQLUINTEGER # fromInteger :: Integer -> SQLUINTEGER # | |
Num SQLULEN | |
Num SQLUSMALLINT | |
Defined in Database.ODBC.Internal Methods (+) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT # (-) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT # (*) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT # negate :: SQLUSMALLINT -> SQLUSMALLINT # abs :: SQLUSMALLINT -> SQLUSMALLINT # signum :: SQLUSMALLINT -> SQLUSMALLINT # fromInteger :: Integer -> SQLUSMALLINT # | |
Num CompOption | |
Defined in Text.Regex.Posix.Wrap Methods (+) :: CompOption -> CompOption -> CompOption # (-) :: CompOption -> CompOption -> CompOption # (*) :: CompOption -> CompOption -> CompOption # negate :: CompOption -> CompOption # abs :: CompOption -> CompOption # signum :: CompOption -> CompOption # fromInteger :: Integer -> CompOption # | |
Num ExecOption | |
Defined in Text.Regex.Posix.Wrap Methods (+) :: ExecOption -> ExecOption -> ExecOption # (-) :: ExecOption -> ExecOption -> ExecOption # (*) :: ExecOption -> ExecOption -> ExecOption # negate :: ExecOption -> ExecOption # abs :: ExecOption -> ExecOption # signum :: ExecOption -> ExecOption # fromInteger :: Integer -> ExecOption # | |
Num Scientific | WARNING: |
Defined in Data.Scientific Methods (+) :: Scientific -> Scientific -> Scientific # (-) :: Scientific -> Scientific -> Scientific # (*) :: Scientific -> Scientific -> Scientific # negate :: Scientific -> Scientific # abs :: Scientific -> Scientific # signum :: Scientific -> Scientific # fromInteger :: Integer -> Scientific # | |
Num I8 | |
Num Size | |
Num B | |
Num DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Num NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (+) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (-) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (*) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # negate :: NominalDiffTime -> NominalDiffTime # abs :: NominalDiffTime -> NominalDiffTime # signum :: NominalDiffTime -> NominalDiffTime # fromInteger :: Integer -> NominalDiffTime # | |
Num Integer | @since base-2.01 |
Num Natural | Note that @since base-4.8.0.0 |
Num Int | @since base-2.01 |
Num Word | @since base-2.01 |
RealFloat a => Num (Complex a) | Since: base-2.1 |
Num a => Num (Max a) | Since: base-4.9.0.0 |
Num a => Num (Min a) | Since: base-4.9.0.0 |
KnownNat n => Num (Zn n) | |
(KnownNat n, NatWithinBound Word64 n) => Num (Zn64 n) | |
Num (CountOf ty) | |
Defined in Basement.Types.OffsetSize | |
Num (Offset ty) | |
Defined in Basement.Types.OffsetSize | |
Num a => Num (Identity a) | @since base-4.9.0.0 |
Defined in GHC.Internal.Data.Functor.Identity | |
Num a => Num (Down a) | @since base-4.11.0.0 |
Num a => Num (Product a) | @since base-4.7.0.0 |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Num a => Num (Sum a) | @since base-4.7.0.0 |
Integral a => Num (Ratio a) | @since base-2.0.1 |
HasResolution a => Num (Fixed a) | Multiplication is not associative or distributive:
Since: base-2.1 |
Num a => Num (Op a b) | |
Num a => Num (Const a b) | @since base-4.9.0.0 |
Defined in GHC.Internal.Data.Functor.Const | |
(Applicative f, Num a) => Num (Ap f a) | Note that even if the underlying Commutativity:
Additive inverse:
Distributivity:
@since base-4.12.0.0 |
Num (f a) => Num (Alt f a) | @since base-4.8.0.0 |
Num a => Num (Tagged s a) | |
Defined in Data.Tagged | |
Num (f (g a)) => Num (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods (+) :: Compose f g a -> Compose f g a -> Compose f g a # (-) :: Compose f g a -> Compose f g a -> Compose f g a # (*) :: Compose f g a -> Compose f g a -> Compose f g a # negate :: Compose f g a -> Compose f g a # abs :: Compose f g a -> Compose f g a # signum :: Compose f g a -> Compose f g a # fromInteger :: Integer -> Compose f g a # |
Parsing of String
s, producing values.
Derived instances of Read
make the following assumptions, which
derived instances of Show
obey:
- If the constructor is defined to be an infix operator, then the
derived
Read
instance will parse only infix applications of the constructor (not the prefix form). - Associativity is not used to reduce the occurrence of parentheses, although precedence may be.
- If the constructor is defined using record syntax, the derived
Read
will parse only the record-syntax form, and furthermore, the fields must be given in the same order as the original declaration. - The derived
Read
instance allows arbitrary Haskell whitespace between tokens of the input string. Extra parentheses are also allowed.
For example, given the declarations
infixr 5 :^: data Tree a = Leaf a | Tree a :^: Tree a
the derived instance of Read
in Haskell 2010 is equivalent to
instance (Read a) => Read (Tree a) where readsPrec d r = readParen (d > app_prec) (\r -> [(Leaf m,t) | ("Leaf",s) <- lex r, (m,t) <- readsPrec (app_prec+1) s]) r ++ readParen (d > up_prec) (\r -> [(u:^:v,w) | (u,s) <- readsPrec (up_prec+1) r, (":^:",t) <- lex s, (v,w) <- readsPrec (up_prec+1) t]) r where app_prec = 10 up_prec = 5
Note that right-associativity of :^:
is unused.
The derived instance in GHC is equivalent to
instance (Read a) => Read (Tree a) where readPrec = parens $ (prec app_prec $ do Ident "Leaf" <- lexP m <- step readPrec return (Leaf m)) +++ (prec up_prec $ do u <- step readPrec Symbol ":^:" <- lexP v <- step readPrec return (u :^: v)) where app_prec = 10 up_prec = 5 readListPrec = readListPrecDefault
Why do both readsPrec
and readPrec
exist, and why does GHC opt to
implement readPrec
in derived Read
instances instead of readsPrec
?
The reason is that readsPrec
is based on the ReadS
type, and although
ReadS
is mentioned in the Haskell 2010 Report, it is not a very efficient
parser data structure.
readPrec
, on the other hand, is based on a much more efficient ReadPrec
datatype (a.k.a "new-style parsers"), but its definition relies on the use
of the RankNTypes
language extension. Therefore, readPrec
(and its
cousin, readListPrec
) are marked as GHC-only. Nevertheless, it is
recommended to use readPrec
instead of readsPrec
whenever possible
for the efficiency improvements it brings.
As mentioned above, derived Read
instances in GHC will implement
readPrec
instead of readsPrec
. The default implementations of
readsPrec
(and its cousin, readList
) will simply use readPrec
under
the hood. If you are writing a Read
instance by hand, it is recommended
to write it like so:
instanceRead
T wherereadPrec
= ...readListPrec
=readListPrecDefault
Methods
Arguments
:: Int | the operator precedence of the enclosing
context (a number from |
-> ReadS a |
attempts to parse a value from the front of the string, returning a list of (parsed value, remaining string) pairs. If there is no successful parse, the returned list is empty.
Derived instances of Read
and Show
satisfy the following:
That is, readsPrec
parses the string produced by
showsPrec
, and delivers the value that
showsPrec
started with.
Instances
Read Key | |
Read DotNetTime | |
Defined in Data.Aeson.Types.Internal Methods readsPrec :: Int -> ReadS DotNetTime # readList :: ReadS [DotNetTime] # readPrec :: ReadPrec DotNetTime # readListPrec :: ReadPrec [DotNetTime] # | |
Read Value | |
Read ByteString | |
Defined in Data.ByteString.Internal.Type Methods readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods readsPrec :: Int -> ReadS ShortByteString # readList :: ReadS [ShortByteString] # | |
Read IntSet | |
Read Word64Set | |
Read Void | Reading a @since base-4.8.0.0 |
Read ByteOrder | @since base-4.11.0.0 |
Read All | @since base-2.01 |
Read Any | @since base-2.01 |
Read Version | @since base-2.01 |
Read CBool | |
Read CChar | |
Read CClock | |
Read CDouble | |
Read CFloat | |
Read CInt | |
Read CIntMax | |
Read CIntPtr | |
Read CLLong | |
Read CLong | |
Read CPtrdiff | |
Read CSChar | |
Read CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSUSeconds # readList :: ReadS [CSUSeconds] # readPrec :: ReadPrec CSUSeconds # readListPrec :: ReadPrec [CSUSeconds] # | |
Read CShort | |
Read CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSigAtomic # readList :: ReadS [CSigAtomic] # readPrec :: ReadPrec CSigAtomic # readListPrec :: ReadPrec [CSigAtomic] # | |
Read CSize | |
Read CTime | |
Read CUChar | |
Read CUInt | |
Read CUIntMax | |
Read CUIntPtr | |
Read CULLong | |
Read CULong | |
Read CUSeconds | |
Read CUShort | |
Read CWchar | |
Read Associativity | @since base-4.6.0.0 |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS Associativity # readList :: ReadS [Associativity] # | |
Read DecidedStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS DecidedStrictness # readList :: ReadS [DecidedStrictness] # | |
Read Fixity | @since base-4.6.0.0 |
Read SourceStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS SourceStrictness # readList :: ReadS [SourceStrictness] # | |
Read SourceUnpackedness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS SourceUnpackedness # readList :: ReadS [SourceUnpackedness] # | |
Read ExitCode | |
Read BufferMode | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS BufferMode # readList :: ReadS [BufferMode] # readPrec :: ReadPrec BufferMode # readListPrec :: ReadPrec [BufferMode] # | |
Read Newline | @since base-4.3.0.0 |
Read NewlineMode | @since base-4.3.0.0 |
Defined in GHC.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS NewlineMode # readList :: ReadS [NewlineMode] # readPrec :: ReadPrec NewlineMode # readListPrec :: ReadPrec [NewlineMode] # | |
Read IOMode | @since base-4.2.0.0 |
Read Int16 | @since base-2.01 |
Read Int32 | @since base-2.01 |
Read Int64 | @since base-2.01 |
Read Int8 | @since base-2.01 |
Read CBlkCnt | |
Read CBlkSize | |
Read CCc | |
Read CClockId | |
Read CDev | |
Read CFsBlkCnt | |
Read CFsFilCnt | |
Read CGid | |
Read CId | |
Read CIno | |
Read CKey | |
Read CMode | |
Read CNfds | |
Read CNlink | |
Read COff | |
Read CPid | |
Read CRLim | |
Read CSocklen | |
Read CSpeed | |
Read CSsize | |
Read CTcflag | |
Read CUid | |
Read Fd | |
Read Lexeme | @since base-2.01 |
Read SomeNat | @since base-4.7.0.0 |
Read GeneralCategory | @since base-2.01 |
Defined in GHC.Internal.Read Methods readsPrec :: Int -> ReadS GeneralCategory # readList :: ReadS [GeneralCategory] # | |
Read Word16 | @since base-2.01 |
Read Word32 | @since base-2.01 |
Read Word64 | @since base-2.01 |
Read Word8 | @since base-2.01 |
Read Ordering | @since base-2.01 |
Read Argument_ArgumentKind | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS Argument_ArgumentKind # readList :: ReadS [Argument_ArgumentKind] # | |
Read Argument_Mode | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS Argument_Mode # readList :: ReadS [Argument_Mode] # | |
Read ArimaForecastingMetrics_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read ArimaModelInfo_SeasonalPeriodsItem | |
Read ArimaResult_SeasonalPeriodsItem | |
Read ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem # readList :: ReadS [ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem] # readPrec :: ReadPrec ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem # readListPrec :: ReadPrec [ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem] # | |
Read AuditLogConfig_LogType | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read DatasetAccessEntry_TargetTypesItem | |
Read HparamTuningTrial_Status | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read JobsListProjection | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS JobsListProjection # readList :: ReadS [JobsListProjection] # | |
Read JobsListStateFilter | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS JobsListStateFilter # readList :: ReadS [JobsListStateFilter] # | |
Read Model_ModelType | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS Model_ModelType # readList :: ReadS [Model_ModelType] # | |
Read Routine_DeterminismLevel | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read Routine_Language | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS Routine_Language # readList :: ReadS [Routine_Language] # | |
Read Routine_RoutineType | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS Routine_RoutineType # readList :: ReadS [Routine_RoutineType] # | |
Read StandardSqlDataType_TypeKind | |
Read TablesGetView | |
Defined in Gogol.BigQuery.Internal.Sum Methods readsPrec :: Int -> ReadS TablesGetView # readList :: ReadS [TablesGetView] # | |
Read TrainingOptions_BoosterType | |
Read TrainingOptions_ColorSpace | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read TrainingOptions_DartNormalizeType | |
Read TrainingOptions_DataFrequency | |
Read TrainingOptions_DataSplitMethod | |
Read TrainingOptions_DistanceType | |
Read TrainingOptions_FeedbackType | |
Read TrainingOptions_HolidayRegion | |
Read TrainingOptions_HparamTuningObjectivesItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read TrainingOptions_KmeansInitializationMethod | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read TrainingOptions_LearnRateStrategy | |
Read TrainingOptions_LossType | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read TrainingOptions_OptimizationStrategy | |
Read TrainingOptions_TreeMethod | |
Defined in Gogol.BigQuery.Internal.Sum | |
Read Base64 | |
Read Date | |
Read DateTime | |
Read Duration | |
Read Time | |
Read AccessToken | |
Defined in Gogol.Types Methods readsPrec :: Int -> ReadS AccessToken # readList :: ReadS [AccessToken] # readPrec :: ReadPrec AccessToken # readListPrec :: ReadPrec [AccessToken] # | |
Read AltJSON | |
Read AltMedia | |
Read ClientId | |
Read FieldMask | |
Read GSecret | |
Read Multipart | |
Read OAuthScope | |
Defined in Gogol.Types Methods readsPrec :: Int -> ReadS OAuthScope # readList :: ReadS [OAuthScope] # readPrec :: ReadPrec OAuthScope # readListPrec :: ReadPrec [OAuthScope] # | |
Read RefreshToken | |
Defined in Gogol.Types Methods readsPrec :: Int -> ReadS RefreshToken # readList :: ReadS [RefreshToken] # | |
Read Seconds | |
Read ServiceId | |
Read Tix | |
Read TixModule | |
Read Hash | |
Read HpcPos | |
Read Form | |
Read Cookie | |
Read CookieJar | |
Read Proxy | |
Read ProxySecureMode | |
Defined in Network.HTTP.Client.Types Methods readsPrec :: Int -> ReadS ProxySecureMode # readList :: ReadS [ProxySecureMode] # | |
Read StdMethod | |
Read IP | |
Read IPv4 | |
Read IPv6 | |
Read IPRange | |
Read JweAlg | |
Read JwsAlg | |
Read Environment | |
Defined in Katip.Core Methods readsPrec :: Int -> ReadS Environment # readList :: ReadS [Environment] # readPrec :: ReadPrec Environment # readListPrec :: ReadPrec [Environment] # | |
Read Namespace | |
Read Severity | |
Read Verbosity | |
Read Pos | |
Read SourcePos | |
Read AsStruct | |
Read StructField | |
Defined in Napkin.Types.Core Methods readsPrec :: Int -> ReadS StructField # readList :: ReadS [StructField] # readPrec :: ReadPrec StructField # readListPrec :: ReadPrec [StructField] # | |
Read AddrInfoFlag | |
Defined in Network.Socket.Info Methods readsPrec :: Int -> ReadS AddrInfoFlag # readList :: ReadS [AddrInfoFlag] # | |
Read NameInfoFlag | |
Defined in Network.Socket.Info Methods readsPrec :: Int -> ReadS NameInfoFlag # readList :: ReadS [NameInfoFlag] # | |
Read ConnectInfo | |
Defined in Database.PostgreSQL.Simple.Internal Methods readsPrec :: Int -> ReadS ConnectInfo # readList :: ReadS [ConnectInfo] # readPrec :: ReadPrec ConnectInfo # readListPrec :: ReadPrec [ConnectInfo] # | |
Read Undefined | |
Read RetryAction | |
Defined in Control.Retry Methods readsPrec :: Int -> ReadS RetryAction # readList :: ReadS [RetryAction] # readPrec :: ReadPrec RetryAction # readListPrec :: ReadPrec [RetryAction] # | |
Read RetryStatus | |
Defined in Control.Retry Methods readsPrec :: Int -> ReadS RetryStatus # readList :: ReadS [RetryStatus] # readPrec :: ReadPrec RetryStatus # readListPrec :: ReadPrec [RetryStatus] # | |
Read LogLevel | |
Read Scientific | Supports the skipping of parentheses and whitespaces. Example: > read " ( (( -1.0e+3 ) ))" :: Scientific -1000.0 (Note: This |
Defined in Data.Scientific Methods readsPrec :: Int -> ReadS Scientific # readList :: ReadS [Scientific] # readPrec :: ReadPrec Scientific # readListPrec :: ReadPrec [Scientific] # | |
Read AcceptHeader | |
Defined in Servant.API.ContentTypes Methods readsPrec :: Int -> ReadS AcceptHeader # readList :: ReadS [AcceptHeader] # | |
Read NoContent | |
Read IsSecure | |
Read AlterTableOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods readsPrec :: Int -> ReadS AlterTableOptions # readList :: ReadS [AlterTableOptions] # | |
Read Dialect | |
Read KeywordMode | |
Defined in Language.SQL.SimpleSQL.Dialect Methods readsPrec :: Int -> ReadS KeywordMode # readList :: ReadS [KeywordMode] # readPrec :: ReadPrec KeywordMode # readListPrec :: ReadPrec [KeywordMode] # | |
Read SetOperatorOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods readsPrec :: Int -> ReadS SetOperatorOptions # readList :: ReadS [SetOperatorOptions] # | |
Read TrieKey | |
Read TrieNodeKey | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie Methods readsPrec :: Int -> ReadS TrieNodeKey # readList :: ReadS [TrieNodeKey] # readPrec :: ReadPrec TrieNodeKey # readListPrec :: ReadPrec [TrieNodeKey] # | |
Read CaseEquality | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS CaseEquality # readList :: ReadS [CaseEquality] # | |
Read CodePointBase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS CodePointBase # readList :: ReadS [CodePointBase] # | |
Read CodePointDigits | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS CodePointDigits # readList :: ReadS [CodePointDigits] # | |
Read EscMode | |
Read EscapeFallBack | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS EscapeFallBack # readList :: ReadS [EscapeFallBack] # | |
Read EscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS EscapeParams # readList :: ReadS [EscapeParams] # | |
Read InLowCase | |
Read InSource | |
Read KeyCharEventHandler | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS KeyCharEventHandler # readList :: ReadS [KeyCharEventHandler] # | |
Read LetterCase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS LetterCase # readList :: ReadS [LetterCase] # readPrec :: ReadPrec LetterCase # readListPrec :: ReadPrec [LetterCase] # | |
Read QuotationRuleIndex | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS QuotationRuleIndex # readList :: ReadS [QuotationRuleIndex] # | |
Read QuotePrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS QuotePrefix # readList :: ReadS [QuotePrefix] # readPrec :: ReadPrec QuotePrefix # readListPrec :: ReadPrec [QuotePrefix] # | |
Read QuotingChars | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS QuotingChars # readList :: ReadS [QuotingChars] # | |
Read ScapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS ScapeParams # readList :: ReadS [ScapeParams] # readPrec :: ReadPrec ScapeParams # readListPrec :: ReadPrec [ScapeParams] # | |
Read ScapingRule | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS ScapingRule # readList :: ReadS [ScapingRule] # readPrec :: ReadPrec ScapingRule # readListPrec :: ReadPrec [ScapingRule] # | |
Read SrcLitStr | |
Read StrLitFmt | |
Read StrLitId | |
Read StrLitPrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS StrLitPrefix # readList :: ReadS [StrLitPrefix] # | |
Read UnEscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods readsPrec :: Int -> ReadS UnEscapeParams # readList :: ReadS [UnEscapeParams] # | |
Read AdminOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS AdminOption # readList :: ReadS [AdminOption] # readPrec :: ReadPrec AdminOption # readListPrec :: ReadPrec [AdminOption] # | |
Read AdminOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS AdminOptionFor # readList :: ReadS [AdminOptionFor] # | |
Read Alias | |
Read AlterDomainAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS AlterDomainAction # readList :: ReadS [AlterDomainAction] # | |
Read AlterTableAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS AlterTableAction # readList :: ReadS [AlterTableAction] # | |
Read AnonymousStruct | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS AnonymousStruct # readList :: ReadS [AnonymousStruct] # | |
Read AsStruct | |
Read BqStructExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS BqStructExpr # readList :: ReadS [BqStructExpr] # | |
Read CastSafe | |
Read CheckOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS CheckOption # readList :: ReadS [CheckOption] # readPrec :: ReadPrec CheckOption # readListPrec :: ReadPrec [CheckOption] # | |
Read ColConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ColConstraint # readList :: ReadS [ColConstraint] # | |
Read ColConstraintDef | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ColConstraintDef # readList :: ReadS [ColConstraintDef] # | |
Read ColumnDef | |
Read Comment | |
Read CompPredQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS CompPredQuantifier # readList :: ReadS [CompPredQuantifier] # | |
Read Corresponding | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS Corresponding # readList :: ReadS [Corresponding] # | |
Read DefaultClause | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS DefaultClause # readList :: ReadS [DefaultClause] # | |
Read Direction | |
Read DropBehaviour | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS DropBehaviour # readList :: ReadS [DropBehaviour] # | |
Read Frame | |
Read FramePos | |
Read FrameRows | |
Read GrantOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS GrantOption # readList :: ReadS [GrantOption] # readPrec :: ReadPrec GrantOption # readListPrec :: ReadPrec [GrantOption] # | |
Read GrantOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS GrantOptionFor # readList :: ReadS [GrantOptionFor] # | |
Read GroupingExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS GroupingExpr # readList :: ReadS [GroupingExpr] # | |
Read IdentityRestart | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS IdentityRestart # readList :: ReadS [IdentityRestart] # | |
Read IdentityWhen | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS IdentityWhen # readList :: ReadS [IdentityWhen] # | |
Read InPredValue | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS InPredValue # readList :: ReadS [InPredValue] # readPrec :: ReadPrec InPredValue # readListPrec :: ReadPrec [InPredValue] # | |
Read InsertSource | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS InsertSource # readList :: ReadS [InsertSource] # | |
Read IntervalTypeField | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS IntervalTypeField # readList :: ReadS [IntervalTypeField] # | |
Read JoinCondition | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS JoinCondition # readList :: ReadS [JoinCondition] # | |
Read JoinType | |
Read Name | |
Read NullsOrder | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS NullsOrder # readList :: ReadS [NullsOrder] # readPrec :: ReadPrec NullsOrder # readListPrec :: ReadPrec [NullsOrder] # | |
Read NullsRespect | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS NullsRespect # readList :: ReadS [NullsRespect] # | |
Read ParensOperator | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ParensOperator # readList :: ReadS [ParensOperator] # | |
Read ParensOperatorArgument | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Read PrecMultiplier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS PrecMultiplier # readList :: ReadS [PrecMultiplier] # | |
Read PrecUnits | |
Read PrivilegeAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS PrivilegeAction # readList :: ReadS [PrivilegeAction] # | |
Read PrivilegeObject | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS PrivilegeObject # readList :: ReadS [PrivilegeObject] # | |
Read QueryExpr | |
Read ReferenceMatch | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ReferenceMatch # readList :: ReadS [ReferenceMatch] # | |
Read ReferentialAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ReferentialAction # readList :: ReadS [ReferentialAction] # | |
Read ScalarExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS ScalarExpr # readList :: ReadS [ScalarExpr] # readPrec :: ReadPrec ScalarExpr # readListPrec :: ReadPrec [ScalarExpr] # | |
Read SequenceGeneratorOption | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Read SetClause | |
Read SetOperatorName | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS SetOperatorName # readList :: ReadS [SetOperatorName] # | |
Read SetQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS SetQuantifier # readList :: ReadS [SetQuantifier] # | |
Read Sign | |
Read SortSpec | |
Read Statement | |
Read SubQueryExprType | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS SubQueryExprType # readList :: ReadS [SubQueryExprType] # | |
Read TableConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS TableConstraint # readList :: ReadS [TableConstraint] # | |
Read TableElement | |
Defined in Language.SQL.SimpleSQL.Syntax Methods readsPrec :: Int -> ReadS TableElement # readList :: ReadS [TableElement] # | |
Read TableRef | |
Read TypeName | |
Read Leniency | |
Read I8 | |
Read FPFormat | |
Read ShortText | |
Read DatatypeVariant | |
Defined in Language.Haskell.TH.Datatype Methods readsPrec :: Int -> ReadS DatatypeVariant # readList :: ReadS [DatatypeVariant] # | |
Read Month | Read as |
Read Quarter | Read as |
Read QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods readsPrec :: Int -> ReadS QuarterOfYear # readList :: ReadS [QuarterOfYear] # | |
Read DayOfWeek | |
Read DiffTime | |
Read NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods readsPrec :: Int -> ReadS NominalDiffTime # readList :: ReadS [NominalDiffTime] # | |
Read SchemaError | |
Defined in URI.ByteString.Types Methods readsPrec :: Int -> ReadS SchemaError # readList :: ReadS [SchemaError] # readPrec :: ReadPrec SchemaError # readListPrec :: ReadPrec [SchemaError] # | |
Read URIParseError | |
Defined in URI.ByteString.Types Methods readsPrec :: Int -> ReadS URIParseError # readList :: ReadS [URIParseError] # | |
Read UUID | |
Read UnpackedUUID | |
Defined in Data.UUID.Types.Internal Methods readsPrec :: Int -> ReadS UnpackedUUID # readList :: ReadS [UnpackedUUID] # | |
Read DictionaryHash | |
Read Integer | @since base-2.01 |
Read Natural | @since base-4.8.0.0 |
Read () | @since base-2.01 |
Read Bool | @since base-2.01 |
Read Char | @since base-2.01 |
Read Double | @since base-2.01 |
Read Float | @since base-2.01 |
Read Int | @since base-2.01 |
Read Word | @since base-4.5.0.0 |
Read a => Read (Only a) | |
Read v => Read (KeyMap v) | |
Read a => Read (Complex a) | Since: base-2.1 |
Read a => Read (First a) | Since: base-4.9.0.0 |
Read a => Read (Last a) | Since: base-4.9.0.0 |
Read a => Read (Max a) | Since: base-4.9.0.0 |
Read a => Read (Min a) | Since: base-4.9.0.0 |
Read m => Read (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods readsPrec :: Int -> ReadS (WrappedMonoid m) # readList :: ReadS [WrappedMonoid m] # readPrec :: ReadPrec (WrappedMonoid m) # readListPrec :: ReadPrec [WrappedMonoid m] # | |
Read vertex => Read (SCC vertex) | Since: containers-0.5.9 |
Read e => Read (IntMap e) | |
Read a => Read (Seq a) | |
Read a => Read (ViewL a) | |
Read a => Read (ViewR a) | |
(Read a, Ord a) => Read (Set a) | |
Read a => Read (Tree a) | |
HashAlgorithm a => Read (Digest a) | |
HashAlgorithm a => Read (Digest a) | |
Read1 f => Read (Fix f) | |
(Functor f, Read1 f) => Read (Mu f) | |
(Functor f, Read1 f) => Read (Nu f) | |
Read a => Read (DNonEmpty a) | |
Read a => Read (DList a) | |
Read a => Read (FromListCounting a) | |
Read e => Read (Word64Map e) | |
Read a => Read (NonEmpty a) | @since base-4.11.0.0 |
Read a => Read (Identity a) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 |
Read a => Read (First a) | @since base-2.01 |
Read a => Read (Last a) | @since base-2.01 |
Read a => Read (Down a) | This instance would be equivalent to the derived instances of the
@since base-4.7.0.0 |
Read a => Read (Dual a) | @since base-2.01 |
Read a => Read (Product a) | @since base-2.01 |
Read a => Read (Sum a) | @since base-2.01 |
Read a => Read (ZipList a) | @since base-4.7.0.0 |
Read p => Read (Par1 p) | @since base-4.7.0.0 |
(Integral a, Read a) => Read (Ratio a) | @since base-2.01 |
Read (OAuthCode s) | |
Read (AddrRange IPv4) | |
Read (AddrRange IPv6) | |
Read e => Read (ErrorFancy e) | |
Defined in Text.Megaparsec.Error Methods readsPrec :: Int -> ReadS (ErrorFancy e) # readList :: ReadS [ErrorFancy e] # readPrec :: ReadPrec (ErrorFancy e) # readListPrec :: ReadPrec [ErrorFancy e] # | |
Read t => Read (ErrorItem t) | |
Read mono => Read (NonNull mono) | |
(Ord a, Read a) => Read (OSet a) | |
Read a => Read (Array a) | |
Read a => Read (SmallArray a) | |
Defined in Data.Primitive.SmallArray Methods readsPrec :: Int -> ReadS (SmallArray a) # readList :: ReadS [SmallArray a] # readPrec :: ReadPrec (SmallArray a) # readListPrec :: ReadPrec [SmallArray a] # | |
Read a => Read (Trie a) | |
Read a => Read (I a) | |
Read a => Read (Maybe a) | |
(Eq a, Hashable a, Read a) => Read (HashSet a) | |
Read a => Read (Vector a) | |
(Read a, Prim a) => Read (Vector a) | |
(Read a, Storable a) => Read (Vector a) | |
Read a => Read (Maybe a) | @since base-2.01 |
Read a => Read (Solo a) | @since base-4.15 |
Read a => Read [a] | @since base-2.01 |
(Ix ix, Read ix, Read e, IArray UArray e) => Read (UArray ix e) | |
HasResolution a => Read (Fixed a) | Since: base-4.3.0.0 |
(Read a, Read b) => Read (Arg a b) | Since: base-4.9.0.0 |
(Ord k, Read k, Read e) => Read (Map k e) | |
(Read1 f, Read a) => Read (Cofree f a) | |
(Read1 f, Read a) => Read (Free f a) | |
(Read a, Read b) => Read (Gr a b) | |
(Ix a, Read a, Read b) => Read (Array a b) | @since base-2.01 |
(Read a, Read b) => Read (Either a b) | @since base-3.0 |
Read (Proxy t) | @since base-4.7.0.0 |
Read (U1 p) | @since base-4.9.0.0 |
Read (V1 p) | @since base-4.9.0.0 |
(Functor f, Read (f a)) => Read (Yoneda f a) | |
(Read i, Read a) => Read (Level i a) | |
(Ord k, Read k, Read v) => Read (OMap k v) | Value-lazy |
(Read a, Read b) => Read (Either a b) | |
(Read a, Read b) => Read (These a b) | |
(Read a, Read b) => Read (Pair a b) | |
(Read a, Read b) => Read (These a b) | |
(Read1 f, Read a) => Read (Lift f a) | |
(Read1 m, Read a) => Read (MaybeT m a) | |
(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) | |
(Read a, Read b) => Read (a, b) | @since base-2.01 |
Read (p (Fix p a) a) => Read (Fix p a) | |
Read (p a a) => Read (Join p a) | |
(Read a, Read (f b)) => Read (CofreeF f a b) | |
Read (w (CofreeF f a (CofreeT f w a))) => Read (CofreeT f w a) | |
(Read a, Read (f b)) => Read (FreeF f a b) | |
(Read1 f, Read1 m, Read a) => Read (FreeT f m a) | |
Read a => Read (Const a b) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 |
Read (f a) => Read (Ap f a) | @since base-4.12.0.0 |
Read (f a) => Read (Alt f a) | @since base-4.8.0.0 |
a ~ b => Read (a :~: b) | @since base-4.7.0.0 |
Read (f p) => Read (Rec1 f p) | @since base-4.7.0.0 |
Read (f (a, b)) => Read (AlongsideLeft f b a) | |
Defined in Control.Lens.Internal.Getter Methods readsPrec :: Int -> ReadS (AlongsideLeft f b a) # readList :: ReadS [AlongsideLeft f b a] # readPrec :: ReadPrec (AlongsideLeft f b a) # readListPrec :: ReadPrec [AlongsideLeft f b a] # | |
Read (f (a, b)) => Read (AlongsideRight f a b) | |
Defined in Control.Lens.Internal.Getter Methods readsPrec :: Int -> ReadS (AlongsideRight f a b) # readList :: ReadS [AlongsideRight f a b] # readPrec :: ReadPrec (AlongsideRight f a b) # readListPrec :: ReadPrec [AlongsideRight f a b] # | |
Read a => Read (K a b) | |
Read b => Read (Tagged s b) | |
(Read (f a), Read (g a), Read a) => Read (These1 f g a) | |
(Read1 f, Read a) => Read (Backwards f a) | |
(Read e, Read1 m, Read a) => Read (ExceptT e m a) | |
(Read1 f, Read a) => Read (IdentityT f a) | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) | |
Read a => Read (Constant a b) | |
(Read1 f, Read a) => Read (Reverse f a) | |
(Read a, Read b, Read c) => Read (a, b, c) | @since base-2.01 |
(Read (f a), Read (g a)) => Read (Product f g a) | Since: base-4.18.0.0 |
(Read (f a), Read (g a)) => Read (Sum f g a) | Since: base-4.18.0.0 |
a ~~ b => Read (a :~~: b) | @since base-4.10.0.0 |
(Read (f p), Read (g p)) => Read ((f :*: g) p) | @since base-4.7.0.0 |
(Read (f p), Read (g p)) => Read ((f :+: g) p) | @since base-4.7.0.0 |
Read c => Read (K1 i c p) | @since base-4.7.0.0 |
(Read a, Read b, Read c, Read d) => Read (a, b, c, d) | @since base-2.01 |
Read (f (g a)) => Read (Compose f g a) | Since: base-4.18.0.0 |
Read (f a) => Read (Clown f a b) | |
Read (p b a) => Read (Flip p a b) | |
Read (g b) => Read (Joker g a b) | |
Read (p a b) => Read (WrappedBifunctor p a b) | |
Defined in Data.Bifunctor.Wrapped Methods readsPrec :: Int -> ReadS (WrappedBifunctor p a b) # readList :: ReadS [WrappedBifunctor p a b] # readPrec :: ReadPrec (WrappedBifunctor p a b) # readListPrec :: ReadPrec [WrappedBifunctor p a b] # | |
Read (f (g p)) => Read ((f :.: g) p) | @since base-4.7.0.0 |
Read (f p) => Read (M1 i c f p) | @since base-4.7.0.0 |
(Read1 f, Read1 g, Read a) => Read ((f :.: g) a) | |
(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e) | @since base-2.01 |
(Read (f a b), Read (g a b)) => Read (Product f g a b) | |
(Read (p a b), Read (q a b)) => Read (Sum p q a b) | |
(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f) | @since base-2.01 |
Read (f (p a b)) => Read (Tannen f p a b) | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h) | @since base-2.01 |
Read (p (f a) (g b)) => Read (Biff p f g a b) | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m) | @since base-2.01 |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | @since base-2.01 |
Defined in GHC.Internal.Read | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | @since base-2.01 |
Defined in GHC.Internal.Read |
class Num a => Fractional a where #
Fractional numbers, supporting real division.
The Haskell Report defines no laws for Fractional
. However, (
and
+
)(
are customarily expected to define a division ring and have the
following properties:*
)
recip
gives the multiplicative inversex * recip x
=recip x * x
=fromInteger 1
- Totality of
toRational
toRational
is total- Coherence with
toRational
- if the type also implements
Real
, thenfromRational
is a left inverse fortoRational
, i.e.fromRational (toRational i) = i
Note that it isn't customarily expected that a type instance of
Fractional
implement a field. However, all instances in base
do.
Minimal complete definition
fromRational, (recip | (/))
Methods
Fractional division.
Reciprocal fraction.
fromRational :: Rational -> a #
Conversion from a Rational
(that is
).
A floating literal stands for an application of Ratio
Integer
fromRational
to a value of type Rational
, so such literals have type
(
.Fractional
a) => a
Instances
Fractional SaneDouble | |
Defined in GHC.Types.SaneDouble Methods (/) :: SaneDouble -> SaneDouble -> SaneDouble # recip :: SaneDouble -> SaneDouble # fromRational :: Rational -> SaneDouble # | |
Fractional CDouble | |
Fractional CFloat | |
Fractional Scientific | WARNING: These methods also compute
|
Defined in Data.Scientific Methods (/) :: Scientific -> Scientific -> Scientific # recip :: Scientific -> Scientific # fromRational :: Rational -> Scientific # | |
Fractional DiffTime | |
Fractional NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (/) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # recip :: NominalDiffTime -> NominalDiffTime # fromRational :: Rational -> NominalDiffTime # | |
RealFloat a => Fractional (Complex a) | Since: base-2.1 |
Fractional a => Fractional (Identity a) | @since base-4.9.0.0 |
Fractional a => Fractional (Down a) | @since base-4.14.0.0 |
Integral a => Fractional (Ratio a) | @since base-2.0.1 |
HasResolution a => Fractional (Fixed a) | Since: base-2.1 |
Fractional a => Fractional (Op a b) | |
Fractional a => Fractional (Const a b) | @since base-4.9.0.0 |
Fractional a => Fractional (Tagged s a) | |
Fractional (f (g a)) => Fractional (Compose f g a) | Since: base-4.20.0.0 |
Conversion of values to readable String
s.
Derived instances of Show
have the following properties, which
are compatible with derived instances of Read
:
- The result of
show
is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used. - If the constructor is defined to be an infix operator, then
showsPrec
will produce infix applications of the constructor. - the representation will be enclosed in parentheses if the
precedence of the top-level constructor in
x
is less thand
(associativity is ignored). Thus, ifd
is0
then the result is never surrounded in parentheses; ifd
is11
it is always surrounded in parentheses, unless it is an atomic expression. - If the constructor is defined using record syntax, then
show
will produce the record-syntax form, with the fields given in the same order as the original declaration.
For example, given the declarations
infixr 5 :^: data Tree a = Leaf a | Tree a :^: Tree a
the derived instance of Show
is equivalent to
instance (Show a) => Show (Tree a) where showsPrec d (Leaf m) = showParen (d > app_prec) $ showString "Leaf " . showsPrec (app_prec+1) m where app_prec = 10 showsPrec d (u :^: v) = showParen (d > up_prec) $ showsPrec (up_prec+1) u . showString " :^: " . showsPrec (up_prec+1) v where up_prec = 5
Note that right-associativity of :^:
is ignored. For example,
produces the stringshow
(Leaf 1 :^: Leaf 2 :^: Leaf 3)"Leaf 1 :^: (Leaf 2 :^: Leaf 3)"
.
Methods
Instances
Show Lit | |
Show Number | |
Show Key | |
Show AesonException | |
Defined in Data.Aeson.Types.Internal Methods showsPrec :: Int -> AesonException -> ShowS # show :: AesonException -> String # showList :: [AesonException] -> ShowS # | |
Show DotNetTime | |
Defined in Data.Aeson.Types.Internal Methods showsPrec :: Int -> DotNetTime -> ShowS # show :: DotNetTime -> String # showList :: [DotNetTime] -> ShowS # | |
Show JSONPathElement | |
Defined in Data.Aeson.Types.Internal Methods showsPrec :: Int -> JSONPathElement -> ShowS # show :: JSONPathElement -> String # showList :: [JSONPathElement] -> ShowS # | |
Show Options | |
Show SumEncoding | |
Defined in Data.Aeson.Types.Internal Methods showsPrec :: Int -> SumEncoding -> ShowS # show :: SumEncoding -> String # showList :: [SumEncoding] -> ShowS # | |
Show Value | Since version 1.5.6.0 version object values are printed in lexicographic key order
|
Show Operation | |
Show Patch | |
Show Key | |
Show Pointer | |
Show JSONWarning | |
Defined in Data.Aeson.WarningParser Methods showsPrec :: Int -> JSONWarning -> ShowS # show :: JSONWarning -> String # showList :: [JSONWarning] -> ShowS # | |
Show More | |
Show Pos | |
Show ByteArray | Since: base-4.17.0.0 |
Show Timeout | Since: base-4.0 |
Show Encoding | |
Show ASCII7_Invalid | |
Show ISO_8859_1_Invalid | |
Show UTF16_Invalid | |
Show UTF32_Invalid | |
Show FileSize | |
Show String | |
Show ByteString | |
Defined in Data.ByteString.Internal.Type Methods showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show SizeOverflowException | |
Defined in Data.ByteString.Internal.Type Methods showsPrec :: Int -> SizeOverflowException -> ShowS # show :: SizeOverflowException -> String # showList :: [SizeOverflowException] -> ShowS # | |
Show ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods showsPrec :: Int -> ShortByteString -> ShowS # show :: ShortByteString -> String # showList :: [ShortByteString] -> ShowS # | |
Show IntSet | |
Show BitQueue | |
Show BitQueueB | |
Show Curve_Edwards25519 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_Edwards25519 -> ShowS # show :: Curve_Edwards25519 -> String # showList :: [Curve_Edwards25519] -> ShowS # | |
Show Curve_P256R1 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_P256R1 -> ShowS # show :: Curve_P256R1 -> String # showList :: [Curve_P256R1] -> ShowS # | |
Show Curve_P384R1 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_P384R1 -> ShowS # show :: Curve_P384R1 -> String # showList :: [Curve_P384R1] -> ShowS # | |
Show Curve_P521R1 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_P521R1 -> ShowS # show :: Curve_P521R1 -> String # showList :: [Curve_P521R1] -> ShowS # | |
Show Curve_X25519 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_X25519 -> ShowS # show :: Curve_X25519 -> String # showList :: [Curve_X25519] -> ShowS # | |
Show Curve_X448 | |
Defined in Crypto.ECC Methods showsPrec :: Int -> Curve_X448 -> ShowS # show :: Curve_X448 -> String # showList :: [Curve_X448] -> ShowS # | |
Show CryptoError | |
Defined in Crypto.Error.Types Methods showsPrec :: Int -> CryptoError -> ShowS # show :: CryptoError -> String # showList :: [CryptoError] -> ShowS # | |
Show Blake2b_160 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_160 -> ShowS # show :: Blake2b_160 -> String # showList :: [Blake2b_160] -> ShowS # | |
Show Blake2b_224 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_224 -> ShowS # show :: Blake2b_224 -> String # showList :: [Blake2b_224] -> ShowS # | |
Show Blake2b_256 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_256 -> ShowS # show :: Blake2b_256 -> String # showList :: [Blake2b_256] -> ShowS # | |
Show Blake2b_384 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_384 -> ShowS # show :: Blake2b_384 -> String # showList :: [Blake2b_384] -> ShowS # | |
Show Blake2b_512 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_512 -> ShowS # show :: Blake2b_512 -> String # showList :: [Blake2b_512] -> ShowS # | |
Show Blake2bp_512 | |
Defined in Crypto.Hash.Blake2bp Methods showsPrec :: Int -> Blake2bp_512 -> ShowS # show :: Blake2bp_512 -> String # showList :: [Blake2bp_512] -> ShowS # | |
Show Blake2s_160 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_160 -> ShowS # show :: Blake2s_160 -> String # showList :: [Blake2s_160] -> ShowS # | |
Show Blake2s_224 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_224 -> ShowS # show :: Blake2s_224 -> String # showList :: [Blake2s_224] -> ShowS # | |
Show Blake2s_256 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_256 -> ShowS # show :: Blake2s_256 -> String # showList :: [Blake2s_256] -> ShowS # | |
Show Blake2sp_224 | |
Defined in Crypto.Hash.Blake2sp Methods showsPrec :: Int -> Blake2sp_224 -> ShowS # show :: Blake2sp_224 -> String # showList :: [Blake2sp_224] -> ShowS # | |
Show Blake2sp_256 | |
Defined in Crypto.Hash.Blake2sp Methods showsPrec :: Int -> Blake2sp_256 -> ShowS # show :: Blake2sp_256 -> String # showList :: [Blake2sp_256] -> ShowS # | |
Show Keccak_224 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_224 -> ShowS # show :: Keccak_224 -> String # showList :: [Keccak_224] -> ShowS # | |
Show Keccak_256 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_256 -> ShowS # show :: Keccak_256 -> String # showList :: [Keccak_256] -> ShowS # | |
Show Keccak_384 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_384 -> ShowS # show :: Keccak_384 -> String # showList :: [Keccak_384] -> ShowS # | |
Show Keccak_512 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_512 -> ShowS # show :: Keccak_512 -> String # showList :: [Keccak_512] -> ShowS # | |
Show MD2 | |
Show MD4 | |
Show MD5 | |
Show RIPEMD160 | |
Show SHA1 | |
Show SHA224 | |
Show SHA256 | |
Show SHA3_224 | |
Show SHA3_256 | |
Show SHA3_384 | |
Show SHA3_512 | |
Show SHA384 | |
Show SHA512 | |
Show SHA512t_224 | |
Defined in Crypto.Hash.SHA512t Methods showsPrec :: Int -> SHA512t_224 -> ShowS # show :: SHA512t_224 -> String # showList :: [SHA512t_224] -> ShowS # | |
Show SHA512t_256 | |
Defined in Crypto.Hash.SHA512t Methods showsPrec :: Int -> SHA512t_256 -> ShowS # show :: SHA512t_256 -> String # showList :: [SHA512t_256] -> ShowS # | |
Show Skein256_224 | |
Defined in Crypto.Hash.Skein256 Methods showsPrec :: Int -> Skein256_224 -> ShowS # show :: Skein256_224 -> String # showList :: [Skein256_224] -> ShowS # | |
Show Skein256_256 | |
Defined in Crypto.Hash.Skein256 Methods showsPrec :: Int -> Skein256_256 -> ShowS # show :: Skein256_256 -> String # showList :: [Skein256_256] -> ShowS # | |
Show Skein512_224 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_224 -> ShowS # show :: Skein512_224 -> String # showList :: [Skein512_224] -> ShowS # | |
Show Skein512_256 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_256 -> ShowS # show :: Skein512_256 -> String # showList :: [Skein512_256] -> ShowS # | |
Show Skein512_384 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_384 -> ShowS # show :: Skein512_384 -> String # showList :: [Skein512_384] -> ShowS # | |
Show Skein512_512 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_512 -> ShowS # show :: Skein512_512 -> String # showList :: [Skein512_512] -> ShowS # | |
Show Tiger | |
Show Whirlpool | |
Show CryptoError | |
Defined in Crypto.Error.Types Methods showsPrec :: Int -> CryptoError -> ShowS # show :: CryptoError -> String # showList :: [CryptoError] -> ShowS # | |
Show Blake2b_160 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_160 -> ShowS # show :: Blake2b_160 -> String # showList :: [Blake2b_160] -> ShowS # | |
Show Blake2b_224 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_224 -> ShowS # show :: Blake2b_224 -> String # showList :: [Blake2b_224] -> ShowS # | |
Show Blake2b_256 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_256 -> ShowS # show :: Blake2b_256 -> String # showList :: [Blake2b_256] -> ShowS # | |
Show Blake2b_384 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_384 -> ShowS # show :: Blake2b_384 -> String # showList :: [Blake2b_384] -> ShowS # | |
Show Blake2b_512 | |
Defined in Crypto.Hash.Blake2b Methods showsPrec :: Int -> Blake2b_512 -> ShowS # show :: Blake2b_512 -> String # showList :: [Blake2b_512] -> ShowS # | |
Show Blake2bp_512 | |
Defined in Crypto.Hash.Blake2bp Methods showsPrec :: Int -> Blake2bp_512 -> ShowS # show :: Blake2bp_512 -> String # showList :: [Blake2bp_512] -> ShowS # | |
Show Blake2s_160 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_160 -> ShowS # show :: Blake2s_160 -> String # showList :: [Blake2s_160] -> ShowS # | |
Show Blake2s_224 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_224 -> ShowS # show :: Blake2s_224 -> String # showList :: [Blake2s_224] -> ShowS # | |
Show Blake2s_256 | |
Defined in Crypto.Hash.Blake2s Methods showsPrec :: Int -> Blake2s_256 -> ShowS # show :: Blake2s_256 -> String # showList :: [Blake2s_256] -> ShowS # | |
Show Blake2sp_224 | |
Defined in Crypto.Hash.Blake2sp Methods showsPrec :: Int -> Blake2sp_224 -> ShowS # show :: Blake2sp_224 -> String # showList :: [Blake2sp_224] -> ShowS # | |
Show Blake2sp_256 | |
Defined in Crypto.Hash.Blake2sp Methods showsPrec :: Int -> Blake2sp_256 -> ShowS # show :: Blake2sp_256 -> String # showList :: [Blake2sp_256] -> ShowS # | |
Show Keccak_224 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_224 -> ShowS # show :: Keccak_224 -> String # showList :: [Keccak_224] -> ShowS # | |
Show Keccak_256 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_256 -> ShowS # show :: Keccak_256 -> String # showList :: [Keccak_256] -> ShowS # | |
Show Keccak_384 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_384 -> ShowS # show :: Keccak_384 -> String # showList :: [Keccak_384] -> ShowS # | |
Show Keccak_512 | |
Defined in Crypto.Hash.Keccak Methods showsPrec :: Int -> Keccak_512 -> ShowS # show :: Keccak_512 -> String # showList :: [Keccak_512] -> ShowS # | |
Show MD2 | |
Show MD4 | |
Show MD5 | |
Show RIPEMD160 | |
Show SHA1 | |
Show SHA224 | |
Show SHA256 | |
Show SHA3_224 | |
Show SHA3_256 | |
Show SHA3_384 | |
Show SHA3_512 | |
Show SHA384 | |
Show SHA512 | |
Show SHA512t_224 | |
Defined in Crypto.Hash.SHA512t Methods showsPrec :: Int -> SHA512t_224 -> ShowS # show :: SHA512t_224 -> String # showList :: [SHA512t_224] -> ShowS # | |
Show SHA512t_256 | |
Defined in Crypto.Hash.SHA512t Methods showsPrec :: Int -> SHA512t_256 -> ShowS # show :: SHA512t_256 -> String # showList :: [SHA512t_256] -> ShowS # | |
Show Skein256_224 | |
Defined in Crypto.Hash.Skein256 Methods showsPrec :: Int -> Skein256_224 -> ShowS # show :: Skein256_224 -> String # showList :: [Skein256_224] -> ShowS # | |
Show Skein256_256 | |
Defined in Crypto.Hash.Skein256 Methods showsPrec :: Int -> Skein256_256 -> ShowS # show :: Skein256_256 -> String # showList :: [Skein256_256] -> ShowS # | |
Show Skein512_224 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_224 -> ShowS # show :: Skein512_224 -> String # showList :: [Skein512_224] -> ShowS # | |
Show Skein512_256 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_256 -> ShowS # show :: Skein512_256 -> String # showList :: [Skein512_256] -> ShowS # | |
Show Skein512_384 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_384 -> ShowS # show :: Skein512_384 -> String # showList :: [Skein512_384] -> ShowS # | |
Show Skein512_512 | |
Defined in Crypto.Hash.Skein512 Methods showsPrec :: Int -> Skein512_512 -> ShowS # show :: Skein512_512 -> String # showList :: [Skein512_512] -> ShowS # | |
Show Tiger | |
Show Whirlpool | |
Show SQLData | |
Show SQLError | |
Show SQLOpenFlag | |
Defined in Database.SQLite3 Methods showsPrec :: Int -> SQLOpenFlag -> ShowS # show :: SQLOpenFlag -> String # showList :: [SQLOpenFlag] -> ShowS # | |
Show SQLVFS | |
Show ArgCount | This just shows the underlying integer, without the data constructor. |
Show CArgCount | This just shows the underlying integer, without the data constructor. |
Show CColumnIndex | This just shows the underlying integer, without the data constructor. |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> CColumnIndex -> ShowS # show :: CColumnIndex -> String # showList :: [CColumnIndex] -> ShowS # | |
Show CColumnType | |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> CColumnType -> ShowS # show :: CColumnType -> String # showList :: [CColumnType] -> ShowS # | |
Show CError | |
Show CNumBytes | |
Show CParamIndex | This just shows the underlying integer, without the data constructor. |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> CParamIndex -> ShowS # show :: CParamIndex -> String # showList :: [CParamIndex] -> ShowS # | |
Show ColumnIndex | This just shows the underlying integer, without the data constructor. |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> ColumnIndex -> ShowS # show :: ColumnIndex -> String # showList :: [ColumnIndex] -> ShowS # | |
Show ColumnType | |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> ColumnType -> ShowS # show :: ColumnType -> String # showList :: [ColumnType] -> ShowS # | |
Show Error | |
Show ParamIndex | This just shows the underlying integer, without the data constructor. |
Defined in Database.SQLite3.Bindings.Types Methods showsPrec :: Int -> ParamIndex -> ShowS # show :: ParamIndex -> String # showList :: [ParamIndex] -> ShowS # | |
Show Format | |
Show Label | |
Show LabelSet | |
Show ExtMode | |
Show Operand | |
Show ShiftMode | |
Show FastString | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> FastString -> ShowS # show :: FastString -> String # showList :: [FastString] -> ShowS # | |
Show LexicalFastString | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> LexicalFastString -> ShowS # show :: LexicalFastString -> String # showList :: [LexicalFastString] -> ShowS # | |
Show NonDetFastString | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> NonDetFastString -> ShowS # show :: NonDetFastString -> String # showList :: [NonDetFastString] -> ShowS # | |
Show Word64Set | |
Show DynamicTooState | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> DynamicTooState -> ShowS # show :: DynamicTooState -> String # showList :: [DynamicTooState] -> ShowS # | |
Show GhcLink | |
Show IncludeSpecs | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> IncludeSpecs -> ShowS # show :: IncludeSpecs -> String # showList :: [IncludeSpecs] -> ShowS # | |
Show PackageArg | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> PackageArg -> ShowS # show :: PackageArg -> String # showList :: [PackageArg] -> ShowS # | |
Show RtsOptsEnabled | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> RtsOptsEnabled -> ShowS # show :: RtsOptsEnabled -> String # showList :: [RtsOptsEnabled] -> ShowS # | |
Show PmEquality | |
Defined in GHC.HsToCore.Pmc.Solver.Types Methods showsPrec :: Int -> PmEquality -> ShowS # show :: PmEquality -> String # showList :: [PmEquality] -> ShowS # | |
Show Ident | |
Show AOp | |
Show Op | |
Show UOp | |
Show AOp | |
Show Op | |
Show UOp | |
Show AnnKeywordId | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> AnnKeywordId -> ShowS # show :: AnnKeywordId -> String # showList :: [AnnKeywordId] -> ShowS # | |
Show BindTag | |
Show DeclTag | |
Show EpaComment | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> EpaComment -> ShowS # show :: EpaComment -> String # showList :: [EpaComment] -> ShowS # | |
Show EpaCommentTok | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> EpaCommentTok -> ShowS # show :: EpaCommentTok -> String # showList :: [EpaCommentTok] -> ShowS # | |
Show HasE | |
Show IsUnicodeSyntax | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> IsUnicodeSyntax -> ShowS # show :: IsUnicodeSyntax -> String # showList :: [IsUnicodeSyntax] -> ShowS # | |
Show ParenType | |
Show LexErrKind | |
Defined in GHC.Parser.Errors.Types Methods showsPrec :: Int -> LexErrKind -> ShowS # show :: LexErrKind -> String # showList :: [LexErrKind] -> ShowS # | |
Show NumUnderscoreReason | |
Defined in GHC.Parser.Errors.Types Methods showsPrec :: Int -> NumUnderscoreReason -> ShowS # show :: NumUnderscoreReason -> String # showList :: [NumUnderscoreReason] -> ShowS # | |
Show ObjectKind | |
Defined in GHC.StgToJS.Object Methods showsPrec :: Int -> ObjectKind -> ShowS # show :: ObjectKind -> String # showList :: [ObjectKind] -> ShowS # | |
Show HasKinds | |
Show SuggestPartialTypeSignatures | |
Defined in GHC.Tc.Errors.Types Methods showsPrec :: Int -> SuggestPartialTypeSignatures -> ShowS # show :: SuggestPartialTypeSignatures -> String # showList :: [SuggestPartialTypeSignatures] -> ShowS # | |
Show SuggestUndecidableInstances | |
Defined in GHC.Tc.Errors.Types Methods showsPrec :: Int -> SuggestUndecidableInstances -> ShowS # show :: SuggestUndecidableInstances -> String # showList :: [SuggestUndecidableInstances] -> ShowS # | |
Show InlineSpec | |
Defined in GHC.Types.Basic Methods showsPrec :: Int -> InlineSpec -> ShowS # show :: InlineSpec -> String # showList :: [InlineSpec] -> ShowS # | |
Show Levity | |
Show PprPrec | |
Show RuleMatchInfo | |
Defined in GHC.Types.Basic Methods showsPrec :: Int -> RuleMatchInfo -> ShowS # show :: RuleMatchInfo -> String # showList :: [RuleMatchInfo] -> ShowS # | |
Show DiagnosticCode | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> DiagnosticCode -> ShowS # show :: DiagnosticCode -> String # showList :: [DiagnosticCode] -> ShowS # | |
Show DiagnosticReason | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> DiagnosticReason -> ShowS # show :: DiagnosticReason -> String # showList :: [DiagnosticReason] -> ShowS # | |
Show Severity | |
Show DuplicateRecordFields | |
Defined in GHC.Types.FieldLabel Methods showsPrec :: Int -> DuplicateRecordFields -> ShowS # show :: DuplicateRecordFields -> String # showList :: [DuplicateRecordFields] -> ShowS # | |
Show FieldSelectors | |
Defined in GHC.Types.FieldLabel Methods showsPrec :: Int -> FieldSelectors -> ShowS # show :: FieldSelectors -> String # showList :: [FieldSelectors] -> ShowS # | |
Show FieldsOrSelectors | |
Defined in GHC.Types.Name.Reader Methods showsPrec :: Int -> FieldsOrSelectors -> ShowS # show :: FieldsOrSelectors -> String # showList :: [FieldsOrSelectors] -> ShowS # | |
Show SaneDouble | |
Defined in GHC.Types.SaneDouble Methods showsPrec :: Int -> SaneDouble -> ShowS # show :: SaneDouble -> String # showList :: [SaneDouble] -> ShowS # | |
Show FractionalExponentBase | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> FractionalExponentBase -> ShowS # show :: FractionalExponentBase -> String # showList :: [FractionalExponentBase] -> ShowS # | |
Show FractionalLit | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> FractionalLit -> ShowS # show :: FractionalLit -> String # showList :: [FractionalLit] -> ShowS # | |
Show IntegralLit | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> IntegralLit -> ShowS # show :: IntegralLit -> String # showList :: [IntegralLit] -> ShowS # | |
Show SourceText | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> SourceText -> ShowS # show :: SourceText -> String # showList :: [SourceText] -> ShowS # | |
Show BufPos | |
Show BufSpan | |
Show DeltaPos | |
Show NoComments | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> NoComments -> ShowS # show :: NoComments -> String # showList :: [NoComments] -> ShowS # | |
Show PsLoc | |
Show PsSpan | |
Show RealSrcLoc | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> RealSrcLoc -> ShowS # show :: RealSrcLoc -> String # showList :: [RealSrcLoc] -> ShowS # | |
Show RealSrcSpan | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> RealSrcSpan -> ShowS # show :: RealSrcSpan -> String # showList :: [RealSrcSpan] -> ShowS # | |
Show SrcLoc | |
Show SrcSpan | |
Show UnhelpfulSpanReason | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> UnhelpfulSpanReason -> ShowS # show :: UnhelpfulSpanReason -> String # showList :: [UnhelpfulSpanReason] -> ShowS # | |
Show TickishPlacement | |
Defined in GHC.Types.Tickish Methods showsPrec :: Int -> TickishPlacement -> ShowS # show :: TickishPlacement -> String # showList :: [TickishPlacement] -> ShowS # | |
Show ModLocation | |
Defined in GHC.Unit.Module.Location Methods showsPrec :: Int -> ModLocation -> ShowS # show :: ModLocation -> String # showList :: [ModLocation] -> ShowS # | |
Show WarningCategory | |
Defined in GHC.Unit.Module.Warnings Methods showsPrec :: Int -> WarningCategory -> ShowS # show :: WarningCategory -> String # showList :: [WarningCategory] -> ShowS # | |
Show Unit | |
Show Doc | |
Show SpliceDecoration | |
Defined in Language.Haskell.Syntax.Decls Methods showsPrec :: Int -> SpliceDecoration -> ShowS # show :: SpliceDecoration -> String # showList :: [SpliceDecoration] -> ShowS # | |
Show ModuleName | |
Defined in Language.Haskell.Syntax.Module.Name Methods showsPrec :: Int -> ModuleName -> ShowS # show :: ModuleName -> String # showList :: [ModuleName] -> ShowS # | |
Show ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type Methods showsPrec :: Int -> ForeignSrcLang -> ShowS # show :: ForeignSrcLang -> String # showList :: [ForeignSrcLang] -> ShowS # | |
Show Extension | |
Show Box | |
Show PrimType | |
Show TsoFlags | |
Show WhatNext | |
Show WhyBlocked | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> WhyBlocked -> ShowS # show :: WhyBlocked -> String # showList :: [WhyBlocked] -> ShowS # | |
Show StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types Methods showsPrec :: Int -> StgInfoTable -> ShowS # show :: StgInfoTable -> String # showList :: [StgInfoTable] -> ShowS # | |
Show CostCentre | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> CostCentre -> ShowS # show :: CostCentre -> String # showList :: [CostCentre] -> ShowS # | |
Show CostCentreStack | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> CostCentreStack -> ShowS # show :: CostCentreStack -> String # showList :: [CostCentreStack] -> ShowS # | |
Show IndexTable | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> IndexTable -> ShowS # show :: IndexTable -> String # showList :: [IndexTable] -> ShowS # | |
Show StgTSOProfInfo | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> StgTSOProfInfo -> ShowS # show :: StgTSOProfInfo -> String # showList :: [StgTSOProfInfo] -> ShowS # | |
Show Void | @since base-4.8.0.0 |
Show ByteOrder | @since base-4.11.0.0 |
Show ClosureType | |
Defined in GHC.Internal.ClosureTypes Methods showsPrec :: Int -> ClosureType -> ShowS # show :: ClosureType -> String # showList :: [ClosureType] -> ShowS # | |
Show BlockReason | @since base-4.3.0.0 |
Defined in GHC.Internal.Conc.Sync Methods showsPrec :: Int -> BlockReason -> ShowS # show :: BlockReason -> String # showList :: [BlockReason] -> ShowS # | |
Show ThreadId | @since base-4.2.0.0 |
Show ThreadStatus | @since base-4.3.0.0 |
Defined in GHC.Internal.Conc.Sync Methods showsPrec :: Int -> ThreadStatus -> ShowS # show :: ThreadStatus -> String # showList :: [ThreadStatus] -> ShowS # | |
Show Constr | @since base-4.0.0.0 |
Show ConstrRep | @since base-4.0.0.0 |
Show DataRep | @since base-4.0.0.0 |
Show DataType | @since base-4.0.0.0 |
Show Fixity | @since base-4.0.0.0 |
Show All | @since base-2.01 |
Show Any | @since base-2.01 |
Show SomeTypeRep | @since base-4.10.0.0 |
Defined in GHC.Internal.Data.Typeable.Internal Methods showsPrec :: Int -> SomeTypeRep -> ShowS # show :: SomeTypeRep -> String # showList :: [SomeTypeRep] -> ShowS # | |
Show Version | @since base-2.01 |
Show ArithException | @since base-4.0.0.0 |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> ArithException -> ShowS # show :: ArithException -> String # showList :: [ArithException] -> ShowS # | |
Show SomeException | Since: ghc-internal-3.0 |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> SomeException -> ShowS # show :: SomeException -> String # showList :: [SomeException] -> ShowS # | |
Show CBool | |
Show CChar | |
Show CClock | |
Show CDouble | |
Show CFloat | |
Show CInt | |
Show CIntMax | |
Show CIntPtr | |
Show CLLong | |
Show CLong | |
Show CPtrdiff | |
Show CSChar | |
Show CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSUSeconds -> ShowS # show :: CSUSeconds -> String # showList :: [CSUSeconds] -> ShowS # | |
Show CShort | |
Show CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSigAtomic -> ShowS # show :: CSigAtomic -> String # showList :: [CSigAtomic] -> ShowS # | |
Show CSize | |
Show CTime | |
Show CUChar | |
Show CUInt | |
Show CUIntMax | |
Show CUIntPtr | |
Show CULLong | |
Show CULong | |
Show CUSeconds | |
Show CUShort | |
Show CWchar | |
Show Associativity | @since base-4.6.0.0 |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> Associativity -> ShowS # show :: Associativity -> String # showList :: [Associativity] -> ShowS # | |
Show DecidedStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> DecidedStrictness -> ShowS # show :: DecidedStrictness -> String # showList :: [DecidedStrictness] -> ShowS # | |
Show Fixity | @since base-4.6.0.0 |
Show SourceStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> SourceStrictness -> ShowS # show :: SourceStrictness -> String # showList :: [SourceStrictness] -> ShowS # | |
Show SourceUnpackedness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> SourceUnpackedness -> ShowS # show :: SourceUnpackedness -> String # showList :: [SourceUnpackedness] -> ShowS # | |
Show MaskingState | @since base-4.3.0.0 |
Defined in GHC.Internal.IO Methods showsPrec :: Int -> MaskingState -> ShowS # show :: MaskingState -> String # showList :: [MaskingState] -> ShowS # | |
Show AllocationLimitExceeded | @since base-4.7.1.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AllocationLimitExceeded -> ShowS # show :: AllocationLimitExceeded -> String # showList :: [AllocationLimitExceeded] -> ShowS # | |
Show ArrayException | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> ArrayException -> ShowS # show :: ArrayException -> String # showList :: [ArrayException] -> ShowS # | |
Show AssertionFailed | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AssertionFailed -> ShowS # show :: AssertionFailed -> String # showList :: [AssertionFailed] -> ShowS # | |
Show AsyncException | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AsyncException -> ShowS # show :: AsyncException -> String # showList :: [AsyncException] -> ShowS # | |
Show BlockedIndefinitelyOnMVar | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> BlockedIndefinitelyOnMVar -> ShowS # show :: BlockedIndefinitelyOnMVar -> String # showList :: [BlockedIndefinitelyOnMVar] -> ShowS # | |
Show BlockedIndefinitelyOnSTM | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> BlockedIndefinitelyOnSTM -> ShowS # show :: BlockedIndefinitelyOnSTM -> String # showList :: [BlockedIndefinitelyOnSTM] -> ShowS # | |
Show CompactionFailed | @since base-4.10.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> CompactionFailed -> ShowS # show :: CompactionFailed -> String # showList :: [CompactionFailed] -> ShowS # | |
Show Deadlock | @since base-4.1.0.0 |
Show ExitCode | |
Show FixIOException | @since base-4.11.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> FixIOException -> ShowS # show :: FixIOException -> String # showList :: [FixIOException] -> ShowS # | |
Show IOErrorType | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> IOErrorType -> ShowS # show :: IOErrorType -> String # showList :: [IOErrorType] -> ShowS # | |
Show IOException | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> IOException -> ShowS # show :: IOException -> String # showList :: [IOException] -> ShowS # | |
Show SomeAsyncException | @since base-4.7.0.0 |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> SomeAsyncException -> ShowS # show :: SomeAsyncException -> String # showList :: [SomeAsyncException] -> ShowS # | |
Show BufferMode | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> BufferMode -> ShowS # show :: BufferMode -> String # showList :: [BufferMode] -> ShowS # | |
Show Handle | @since base-4.1.0.0 |
Show HandleType | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> HandleType -> ShowS # show :: HandleType -> String # showList :: [HandleType] -> ShowS # | |
Show Newline | @since base-4.3.0.0 |
Show NewlineMode | @since base-4.3.0.0 |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> NewlineMode -> ShowS # show :: NewlineMode -> String # showList :: [NewlineMode] -> ShowS # | |
Show IOMode | @since base-4.2.0.0 |
Show Int16 | @since base-2.01 |
Show Int32 | @since base-2.01 |
Show Int64 | @since base-2.01 |
Show Int8 | @since base-2.01 |
Show CCFlags | @since base-4.8.0.0 |
Show ConcFlags | @since base-4.8.0.0 |
Show DebugFlags | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DebugFlags -> ShowS # show :: DebugFlags -> String # showList :: [DebugFlags] -> ShowS # | |
Show DoCostCentres | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DoCostCentres -> ShowS # show :: DoCostCentres -> String # showList :: [DoCostCentres] -> ShowS # | |
Show DoHeapProfile | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DoHeapProfile -> ShowS # show :: DoHeapProfile -> String # showList :: [DoHeapProfile] -> ShowS # | |
Show DoTrace | @since base-4.8.0.0 |
Show GCFlags | @since base-4.8.0.0 |
Show GiveGCStats | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> GiveGCStats -> ShowS # show :: GiveGCStats -> String # showList :: [GiveGCStats] -> ShowS # | |
Show HpcFlags | @since base-4.20.0.0 |
Show IoSubSystem | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> IoSubSystem -> ShowS # show :: IoSubSystem -> String # showList :: [IoSubSystem] -> ShowS # | |
Show MiscFlags | @since base-4.8.0.0 |
Show ParFlags | @since base-4.8.0.0 |
Show ProfFlags | @since base-4.8.0.0 |
Show RTSFlags | @since base-4.8.0.0 |
Show TickyFlags | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> TickyFlags -> ShowS # show :: TickyFlags -> String # showList :: [TickyFlags] -> ShowS # | |
Show TraceFlags | @since base-4.8.0.0 |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> TraceFlags -> ShowS # show :: TraceFlags -> String # showList :: [TraceFlags] -> ShowS # | |
Show FractionalExponentBase | |
Defined in GHC.Internal.Real Methods showsPrec :: Int -> FractionalExponentBase -> ShowS # show :: FractionalExponentBase -> String # showList :: [FractionalExponentBase] -> ShowS # | |
Show CallStack | @since base-4.9.0.0 |
Show SrcLoc | @since base-4.9.0.0 |
Show CBlkCnt | |
Show CBlkSize | |
Show CCc | |
Show CClockId | |
Show CDev | |
Show CFsBlkCnt | |
Show CFsFilCnt | |
Show CGid | |
Show CId | |
Show CIno | |
Show CKey | |
Show CMode | |
Show CNfds | |
Show CNlink | |
Show COff | |
Show CPid | |
Show CRLim | |
Show CSocklen | |
Show CSpeed | |
Show CSsize | |
Show CTcflag | |
Show CTimer | |
Show CUid | |
Show Fd | |
Show SomeNat | @since base-4.7.0.0 |
Show GeneralCategory | @since base-2.01 |
Defined in GHC.Internal.Unicode Methods showsPrec :: Int -> GeneralCategory -> ShowS # show :: GeneralCategory -> String # showList :: [GeneralCategory] -> ShowS # | |
Show Word16 | @since base-2.01 |
Show Word32 | @since base-2.01 |
Show Word64 | @since base-2.01 |
Show Word8 | @since base-2.01 |
Show KindRep | |
Show Module | @since base-4.9.0.0 |
Show Ordering | @since base-2.01 |
Show TrName | @since base-4.9.0.0 |
Show TyCon | @since base-2.01 |
Show TypeLitSort | @since base-4.11.0.0 |
Defined in GHC.Internal.Show Methods showsPrec :: Int -> TypeLitSort -> ShowS # show :: TypeLitSort -> String # showList :: [TypeLitSort] -> ShowS # | |
Show FFIConv | |
Show FFIType | |
Show EvalBreakpoint | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalBreakpoint -> ShowS # show :: EvalBreakpoint -> String # showList :: [EvalBreakpoint] -> ShowS # | |
Show EvalOpts | |
Show QState | |
Show SerializableException | |
Defined in GHCi.Message Methods showsPrec :: Int -> SerializableException -> ShowS # show :: SerializableException -> String # showList :: [SerializableException] -> ShowS # | |
Show THResultType | |
Defined in GHCi.Message Methods showsPrec :: Int -> THResultType -> ShowS # show :: THResultType -> String # showList :: [THResultType] -> ShowS # | |
Show HValue | |
Show ResolvedBCO | |
Defined in GHCi.ResolvedBCO Methods showsPrec :: Int -> ResolvedBCO -> ShowS # show :: ResolvedBCO -> String # showList :: [ResolvedBCO] -> ShowS # | |
Show ResolvedBCOPtr | |
Defined in GHCi.ResolvedBCO Methods showsPrec :: Int -> ResolvedBCOPtr -> ShowS # show :: ResolvedBCOPtr -> String # showList :: [ResolvedBCOPtr] -> ShowS # | |
Show AuthError | |
Show AuthorizedUser | |
Defined in Gogol.Internal.Auth Methods showsPrec :: Int -> AuthorizedUser -> ShowS # show :: AuthorizedUser -> String # showList :: [AuthorizedUser] -> ShowS # | |
Show OAuthClient | |
Defined in Gogol.Internal.Auth Methods showsPrec :: Int -> OAuthClient -> ShowS # show :: OAuthClient -> String # showList :: [OAuthClient] -> ShowS # | |
Show ServiceAccount | |
Defined in Gogol.Internal.Auth Methods showsPrec :: Int -> ServiceAccount -> ShowS # show :: ServiceAccount -> String # showList :: [ServiceAccount] -> ShowS # | |
Show BigQueryDatasetsDelete | |
Defined in Gogol.BigQuery.Datasets.Delete Methods showsPrec :: Int -> BigQueryDatasetsDelete -> ShowS # show :: BigQueryDatasetsDelete -> String # showList :: [BigQueryDatasetsDelete] -> ShowS # | |
Show BigQueryDatasetsGet | |
Defined in Gogol.BigQuery.Datasets.Get Methods showsPrec :: Int -> BigQueryDatasetsGet -> ShowS # show :: BigQueryDatasetsGet -> String # showList :: [BigQueryDatasetsGet] -> ShowS # | |
Show BigQueryDatasetsInsert | |
Defined in Gogol.BigQuery.Datasets.Insert Methods showsPrec :: Int -> BigQueryDatasetsInsert -> ShowS # show :: BigQueryDatasetsInsert -> String # showList :: [BigQueryDatasetsInsert] -> ShowS # | |
Show BigQueryDatasetsList | |
Defined in Gogol.BigQuery.Datasets.List Methods showsPrec :: Int -> BigQueryDatasetsList -> ShowS # show :: BigQueryDatasetsList -> String # showList :: [BigQueryDatasetsList] -> ShowS # | |
Show BigQueryDatasetsPatch | |
Defined in Gogol.BigQuery.Datasets.Patch Methods showsPrec :: Int -> BigQueryDatasetsPatch -> ShowS # show :: BigQueryDatasetsPatch -> String # showList :: [BigQueryDatasetsPatch] -> ShowS # | |
Show BigQueryDatasetsUpdate | |
Defined in Gogol.BigQuery.Datasets.Update Methods showsPrec :: Int -> BigQueryDatasetsUpdate -> ShowS # show :: BigQueryDatasetsUpdate -> String # showList :: [BigQueryDatasetsUpdate] -> ShowS # | |
Show AggregateClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> AggregateClassificationMetrics -> ShowS # show :: AggregateClassificationMetrics -> String # showList :: [AggregateClassificationMetrics] -> ShowS # | |
Show Argument | |
Show ArimaCoefficients | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaCoefficients -> ShowS # show :: ArimaCoefficients -> String # showList :: [ArimaCoefficients] -> ShowS # | |
Show ArimaFittingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaFittingMetrics -> ShowS # show :: ArimaFittingMetrics -> String # showList :: [ArimaFittingMetrics] -> ShowS # | |
Show ArimaForecastingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaForecastingMetrics -> ShowS # show :: ArimaForecastingMetrics -> String # showList :: [ArimaForecastingMetrics] -> ShowS # | |
Show ArimaModelInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaModelInfo -> ShowS # show :: ArimaModelInfo -> String # showList :: [ArimaModelInfo] -> ShowS # | |
Show ArimaOrder | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaOrder -> ShowS # show :: ArimaOrder -> String # showList :: [ArimaOrder] -> ShowS # | |
Show ArimaResult | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaResult -> ShowS # show :: ArimaResult -> String # showList :: [ArimaResult] -> ShowS # | |
Show ArimaSingleModelForecastingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ArimaSingleModelForecastingMetrics -> ShowS # | |
Show AuditConfig | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> AuditConfig -> ShowS # show :: AuditConfig -> String # showList :: [AuditConfig] -> ShowS # | |
Show AuditLogConfig | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> AuditLogConfig -> ShowS # show :: AuditLogConfig -> String # showList :: [AuditLogConfig] -> ShowS # | |
Show AvroOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> AvroOptions -> ShowS # show :: AvroOptions -> String # showList :: [AvroOptions] -> ShowS # | |
Show BiEngineReason | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BiEngineReason -> ShowS # show :: BiEngineReason -> String # showList :: [BiEngineReason] -> ShowS # | |
Show BiEngineStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BiEngineStatistics -> ShowS # show :: BiEngineStatistics -> String # showList :: [BiEngineStatistics] -> ShowS # | |
Show BigQueryModelTraining | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BigQueryModelTraining -> ShowS # show :: BigQueryModelTraining -> String # showList :: [BigQueryModelTraining] -> ShowS # | |
Show BigtableColumn | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BigtableColumn -> ShowS # show :: BigtableColumn -> String # showList :: [BigtableColumn] -> ShowS # | |
Show BigtableColumnFamily | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BigtableColumnFamily -> ShowS # show :: BigtableColumnFamily -> String # showList :: [BigtableColumnFamily] -> ShowS # | |
Show BigtableOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BigtableOptions -> ShowS # show :: BigtableOptions -> String # showList :: [BigtableOptions] -> ShowS # | |
Show BinaryClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BinaryClassificationMetrics -> ShowS # show :: BinaryClassificationMetrics -> String # showList :: [BinaryClassificationMetrics] -> ShowS # | |
Show BinaryConfusionMatrix | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BinaryConfusionMatrix -> ShowS # show :: BinaryConfusionMatrix -> String # showList :: [BinaryConfusionMatrix] -> ShowS # | |
Show Binding | |
Show BqmlIterationResult | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BqmlIterationResult -> ShowS # show :: BqmlIterationResult -> String # showList :: [BqmlIterationResult] -> ShowS # | |
Show BqmlTrainingRun | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BqmlTrainingRun -> ShowS # show :: BqmlTrainingRun -> String # showList :: [BqmlTrainingRun] -> ShowS # | |
Show BqmlTrainingRun_TrainingOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> BqmlTrainingRun_TrainingOptions -> ShowS # | |
Show CategoricalValue | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> CategoricalValue -> ShowS # show :: CategoricalValue -> String # showList :: [CategoricalValue] -> ShowS # | |
Show CategoryCount | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> CategoryCount -> ShowS # show :: CategoryCount -> String # showList :: [CategoryCount] -> ShowS # | |
Show CloneDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> CloneDefinition -> ShowS # show :: CloneDefinition -> String # showList :: [CloneDefinition] -> ShowS # | |
Show Cluster | |
Show ClusterInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ClusterInfo -> ShowS # show :: ClusterInfo -> String # showList :: [ClusterInfo] -> ShowS # | |
Show Clustering | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Clustering -> ShowS # show :: Clustering -> String # showList :: [Clustering] -> ShowS # | |
Show ClusteringMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ClusteringMetrics -> ShowS # show :: ClusteringMetrics -> String # showList :: [ClusteringMetrics] -> ShowS # | |
Show ConfusionMatrix | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ConfusionMatrix -> ShowS # show :: ConfusionMatrix -> String # showList :: [ConfusionMatrix] -> ShowS # | |
Show ConnectionProperty | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ConnectionProperty -> ShowS # show :: ConnectionProperty -> String # showList :: [ConnectionProperty] -> ShowS # | |
Show CsvOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> CsvOptions -> ShowS # show :: CsvOptions -> String # showList :: [CsvOptions] -> ShowS # | |
Show DataMaskingStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DataMaskingStatistics -> ShowS # show :: DataMaskingStatistics -> String # showList :: [DataMaskingStatistics] -> ShowS # | |
Show DataSplitResult | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DataSplitResult -> ShowS # show :: DataSplitResult -> String # showList :: [DataSplitResult] -> ShowS # | |
Show Dataset | |
Show DatasetAccessEntry | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DatasetAccessEntry -> ShowS # show :: DatasetAccessEntry -> String # showList :: [DatasetAccessEntry] -> ShowS # | |
Show DatasetList | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DatasetList -> ShowS # show :: DatasetList -> String # showList :: [DatasetList] -> ShowS # | |
Show DatasetList_DatasetsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DatasetList_DatasetsItem -> ShowS # show :: DatasetList_DatasetsItem -> String # showList :: [DatasetList_DatasetsItem] -> ShowS # | |
Show DatasetList_DatasetsItem_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DatasetList_DatasetsItem_Labels -> ShowS # | |
Show DatasetReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DatasetReference -> ShowS # show :: DatasetReference -> String # showList :: [DatasetReference] -> ShowS # | |
Show Dataset_AccessItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Dataset_AccessItem -> ShowS # show :: Dataset_AccessItem -> String # showList :: [Dataset_AccessItem] -> ShowS # | |
Show Dataset_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Dataset_Labels -> ShowS # show :: Dataset_Labels -> String # showList :: [Dataset_Labels] -> ShowS # | |
Show Dataset_TagsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Dataset_TagsItem -> ShowS # show :: Dataset_TagsItem -> String # showList :: [Dataset_TagsItem] -> ShowS # | |
Show DestinationTableProperties | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DestinationTableProperties -> ShowS # show :: DestinationTableProperties -> String # showList :: [DestinationTableProperties] -> ShowS # | |
Show DestinationTableProperties_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DestinationTableProperties_Labels -> ShowS # | |
Show DimensionalityReductionMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DimensionalityReductionMetrics -> ShowS # show :: DimensionalityReductionMetrics -> String # showList :: [DimensionalityReductionMetrics] -> ShowS # | |
Show DmlStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DmlStatistics -> ShowS # show :: DmlStatistics -> String # showList :: [DmlStatistics] -> ShowS # | |
Show DoubleCandidates | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DoubleCandidates -> ShowS # show :: DoubleCandidates -> String # showList :: [DoubleCandidates] -> ShowS # | |
Show DoubleHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DoubleHparamSearchSpace -> ShowS # show :: DoubleHparamSearchSpace -> String # showList :: [DoubleHparamSearchSpace] -> ShowS # | |
Show DoubleRange | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> DoubleRange -> ShowS # show :: DoubleRange -> String # showList :: [DoubleRange] -> ShowS # | |
Show EncryptionConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> EncryptionConfiguration -> ShowS # show :: EncryptionConfiguration -> String # showList :: [EncryptionConfiguration] -> ShowS # | |
Show Entry | |
Show ErrorProto | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ErrorProto -> ShowS # show :: ErrorProto -> String # showList :: [ErrorProto] -> ShowS # | |
Show EvaluationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> EvaluationMetrics -> ShowS # show :: EvaluationMetrics -> String # showList :: [EvaluationMetrics] -> ShowS # | |
Show ExplainQueryStage | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ExplainQueryStage -> ShowS # show :: ExplainQueryStage -> String # showList :: [ExplainQueryStage] -> ShowS # | |
Show ExplainQueryStep | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ExplainQueryStep -> ShowS # show :: ExplainQueryStep -> String # showList :: [ExplainQueryStep] -> ShowS # | |
Show Explanation | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Explanation -> ShowS # show :: Explanation -> String # showList :: [Explanation] -> ShowS # | |
Show Expr | |
Show ExternalDataConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ExternalDataConfiguration -> ShowS # show :: ExternalDataConfiguration -> String # showList :: [ExternalDataConfiguration] -> ShowS # | |
Show FeatureValue | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> FeatureValue -> ShowS # show :: FeatureValue -> String # showList :: [FeatureValue] -> ShowS # | |
Show GetIamPolicyRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GetIamPolicyRequest -> ShowS # show :: GetIamPolicyRequest -> String # showList :: [GetIamPolicyRequest] -> ShowS # | |
Show GetPolicyOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GetPolicyOptions -> ShowS # show :: GetPolicyOptions -> String # showList :: [GetPolicyOptions] -> ShowS # | |
Show GetQueryResultsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GetQueryResultsResponse -> ShowS # show :: GetQueryResultsResponse -> String # showList :: [GetQueryResultsResponse] -> ShowS # | |
Show GetServiceAccountResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GetServiceAccountResponse -> ShowS # show :: GetServiceAccountResponse -> String # showList :: [GetServiceAccountResponse] -> ShowS # | |
Show GlobalExplanation | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GlobalExplanation -> ShowS # show :: GlobalExplanation -> String # showList :: [GlobalExplanation] -> ShowS # | |
Show GoogleSheetsOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> GoogleSheetsOptions -> ShowS # show :: GoogleSheetsOptions -> String # showList :: [GoogleSheetsOptions] -> ShowS # | |
Show HivePartitioningOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> HivePartitioningOptions -> ShowS # show :: HivePartitioningOptions -> String # showList :: [HivePartitioningOptions] -> ShowS # | |
Show HparamSearchSpaces | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> HparamSearchSpaces -> ShowS # show :: HparamSearchSpaces -> String # showList :: [HparamSearchSpaces] -> ShowS # | |
Show HparamTuningTrial | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> HparamTuningTrial -> ShowS # show :: HparamTuningTrial -> String # showList :: [HparamTuningTrial] -> ShowS # | |
Show IndexUnusedReason | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> IndexUnusedReason -> ShowS # show :: IndexUnusedReason -> String # showList :: [IndexUnusedReason] -> ShowS # | |
Show IntArray | |
Show IntArrayHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> IntArrayHparamSearchSpace -> ShowS # show :: IntArrayHparamSearchSpace -> String # showList :: [IntArrayHparamSearchSpace] -> ShowS # | |
Show IntCandidates | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> IntCandidates -> ShowS # show :: IntCandidates -> String # showList :: [IntCandidates] -> ShowS # | |
Show IntHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> IntHparamSearchSpace -> ShowS # show :: IntHparamSearchSpace -> String # showList :: [IntHparamSearchSpace] -> ShowS # | |
Show IntRange | |
Show IterationResult | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> IterationResult -> ShowS # show :: IterationResult -> String # showList :: [IterationResult] -> ShowS # | |
Show Job | |
Show JobCancelResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobCancelResponse -> ShowS # show :: JobCancelResponse -> String # showList :: [JobCancelResponse] -> ShowS # | |
Show JobConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfiguration -> ShowS # show :: JobConfiguration -> String # showList :: [JobConfiguration] -> ShowS # | |
Show JobConfigurationExtract | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfigurationExtract -> ShowS # show :: JobConfigurationExtract -> String # showList :: [JobConfigurationExtract] -> ShowS # | |
Show JobConfigurationLoad | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfigurationLoad -> ShowS # show :: JobConfigurationLoad -> String # showList :: [JobConfigurationLoad] -> ShowS # | |
Show JobConfigurationQuery | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfigurationQuery -> ShowS # show :: JobConfigurationQuery -> String # showList :: [JobConfigurationQuery] -> ShowS # | |
Show JobConfigurationQuery_TableDefinitions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfigurationQuery_TableDefinitions -> ShowS # show :: JobConfigurationQuery_TableDefinitions -> String # showList :: [JobConfigurationQuery_TableDefinitions] -> ShowS # | |
Show JobConfigurationTableCopy | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfigurationTableCopy -> ShowS # show :: JobConfigurationTableCopy -> String # showList :: [JobConfigurationTableCopy] -> ShowS # | |
Show JobConfiguration_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobConfiguration_Labels -> ShowS # show :: JobConfiguration_Labels -> String # showList :: [JobConfiguration_Labels] -> ShowS # | |
Show JobList | |
Show JobList_JobsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobList_JobsItem -> ShowS # show :: JobList_JobsItem -> String # showList :: [JobList_JobsItem] -> ShowS # | |
Show JobReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobReference -> ShowS # show :: JobReference -> String # showList :: [JobReference] -> ShowS # | |
Show JobStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics -> ShowS # show :: JobStatistics -> String # showList :: [JobStatistics] -> ShowS # | |
Show JobStatistics2 | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics2 -> ShowS # show :: JobStatistics2 -> String # showList :: [JobStatistics2] -> ShowS # | |
Show JobStatistics2_ReservationUsageItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics2_ReservationUsageItem -> ShowS # show :: JobStatistics2_ReservationUsageItem -> String # showList :: [JobStatistics2_ReservationUsageItem] -> ShowS # | |
Show JobStatistics3 | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics3 -> ShowS # show :: JobStatistics3 -> String # showList :: [JobStatistics3] -> ShowS # | |
Show JobStatistics4 | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics4 -> ShowS # show :: JobStatistics4 -> String # showList :: [JobStatistics4] -> ShowS # | |
Show JobStatistics5 | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics5 -> ShowS # show :: JobStatistics5 -> String # showList :: [JobStatistics5] -> ShowS # | |
Show JobStatistics_ReservationUsageItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JobStatistics_ReservationUsageItem -> ShowS # | |
Show JobStatus | |
Show JsonObject | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> JsonObject -> ShowS # show :: JsonObject -> String # showList :: [JsonObject] -> ShowS # | |
Show ListModelsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ListModelsResponse -> ShowS # show :: ListModelsResponse -> String # showList :: [ListModelsResponse] -> ShowS # | |
Show ListRoutinesResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ListRoutinesResponse -> ShowS # show :: ListRoutinesResponse -> String # showList :: [ListRoutinesResponse] -> ShowS # | |
Show ListRowAccessPoliciesResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ListRowAccessPoliciesResponse -> ShowS # show :: ListRowAccessPoliciesResponse -> String # showList :: [ListRowAccessPoliciesResponse] -> ShowS # | |
Show LocationMetadata | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> LocationMetadata -> ShowS # show :: LocationMetadata -> String # showList :: [LocationMetadata] -> ShowS # | |
Show MaterializedViewDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> MaterializedViewDefinition -> ShowS # show :: MaterializedViewDefinition -> String # showList :: [MaterializedViewDefinition] -> ShowS # | |
Show MlStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> MlStatistics -> ShowS # show :: MlStatistics -> String # showList :: [MlStatistics] -> ShowS # | |
Show Model | |
Show ModelDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ModelDefinition -> ShowS # show :: ModelDefinition -> String # showList :: [ModelDefinition] -> ShowS # | |
Show ModelDefinition_ModelOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ModelDefinition_ModelOptions -> ShowS # show :: ModelDefinition_ModelOptions -> String # showList :: [ModelDefinition_ModelOptions] -> ShowS # | |
Show ModelReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ModelReference -> ShowS # show :: ModelReference -> String # showList :: [ModelReference] -> ShowS # | |
Show Model_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Model_Labels -> ShowS # show :: Model_Labels -> String # showList :: [Model_Labels] -> ShowS # | |
Show MultiClassClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> MultiClassClassificationMetrics -> ShowS # | |
Show ParquetOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ParquetOptions -> ShowS # show :: ParquetOptions -> String # showList :: [ParquetOptions] -> ShowS # | |
Show Policy | |
Show PrincipalComponentInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> PrincipalComponentInfo -> ShowS # show :: PrincipalComponentInfo -> String # showList :: [PrincipalComponentInfo] -> ShowS # | |
Show ProjectList | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ProjectList -> ShowS # show :: ProjectList -> String # showList :: [ProjectList] -> ShowS # | |
Show ProjectList_ProjectsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ProjectList_ProjectsItem -> ShowS # show :: ProjectList_ProjectsItem -> String # showList :: [ProjectList_ProjectsItem] -> ShowS # | |
Show ProjectReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ProjectReference -> ShowS # show :: ProjectReference -> String # showList :: [ProjectReference] -> ShowS # | |
Show QueryParameter | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryParameter -> ShowS # show :: QueryParameter -> String # showList :: [QueryParameter] -> ShowS # | |
Show QueryParameterType | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryParameterType -> ShowS # show :: QueryParameterType -> String # showList :: [QueryParameterType] -> ShowS # | |
Show QueryParameterType_StructTypesItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryParameterType_StructTypesItem -> ShowS # | |
Show QueryParameterValue | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryParameterValue -> ShowS # show :: QueryParameterValue -> String # showList :: [QueryParameterValue] -> ShowS # | |
Show QueryParameterValue_StructValues | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryParameterValue_StructValues -> ShowS # | |
Show QueryRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryRequest -> ShowS # show :: QueryRequest -> String # showList :: [QueryRequest] -> ShowS # | |
Show QueryRequest_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryRequest_Labels -> ShowS # show :: QueryRequest_Labels -> String # showList :: [QueryRequest_Labels] -> ShowS # | |
Show QueryResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryResponse -> ShowS # show :: QueryResponse -> String # showList :: [QueryResponse] -> ShowS # | |
Show QueryTimelineSample | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> QueryTimelineSample -> ShowS # show :: QueryTimelineSample -> String # showList :: [QueryTimelineSample] -> ShowS # | |
Show RangePartitioning | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RangePartitioning -> ShowS # show :: RangePartitioning -> String # showList :: [RangePartitioning] -> ShowS # | |
Show RangePartitioning_Range | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RangePartitioning_Range -> ShowS # show :: RangePartitioning_Range -> String # showList :: [RangePartitioning_Range] -> ShowS # | |
Show RankingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RankingMetrics -> ShowS # show :: RankingMetrics -> String # showList :: [RankingMetrics] -> ShowS # | |
Show RegressionMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RegressionMetrics -> ShowS # show :: RegressionMetrics -> String # showList :: [RegressionMetrics] -> ShowS # | |
Show RemoteFunctionOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RemoteFunctionOptions -> ShowS # show :: RemoteFunctionOptions -> String # showList :: [RemoteFunctionOptions] -> ShowS # | |
Show RemoteFunctionOptions_UserDefinedContext | |
Defined in Gogol.BigQuery.Internal.Product | |
Show Routine | |
Show RoutineReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RoutineReference -> ShowS # show :: RoutineReference -> String # showList :: [RoutineReference] -> ShowS # | |
Show Row | |
Show RowAccessPolicy | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RowAccessPolicy -> ShowS # show :: RowAccessPolicy -> String # showList :: [RowAccessPolicy] -> ShowS # | |
Show RowAccessPolicyReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RowAccessPolicyReference -> ShowS # show :: RowAccessPolicyReference -> String # showList :: [RowAccessPolicyReference] -> ShowS # | |
Show RowLevelSecurityStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> RowLevelSecurityStatistics -> ShowS # show :: RowLevelSecurityStatistics -> String # showList :: [RowLevelSecurityStatistics] -> ShowS # | |
Show ScriptStackFrame | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ScriptStackFrame -> ShowS # show :: ScriptStackFrame -> String # showList :: [ScriptStackFrame] -> ShowS # | |
Show ScriptStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ScriptStatistics -> ShowS # show :: ScriptStatistics -> String # showList :: [ScriptStatistics] -> ShowS # | |
Show SearchStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SearchStatistics -> ShowS # show :: SearchStatistics -> String # showList :: [SearchStatistics] -> ShowS # | |
Show SessionInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SessionInfo -> ShowS # show :: SessionInfo -> String # showList :: [SessionInfo] -> ShowS # | |
Show SetIamPolicyRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SetIamPolicyRequest -> ShowS # show :: SetIamPolicyRequest -> String # showList :: [SetIamPolicyRequest] -> ShowS # | |
Show SnapshotDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SnapshotDefinition -> ShowS # show :: SnapshotDefinition -> String # showList :: [SnapshotDefinition] -> ShowS # | |
Show SparkLoggingInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SparkLoggingInfo -> ShowS # show :: SparkLoggingInfo -> String # showList :: [SparkLoggingInfo] -> ShowS # | |
Show SparkOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SparkOptions -> ShowS # show :: SparkOptions -> String # showList :: [SparkOptions] -> ShowS # | |
Show SparkOptions_Properties | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SparkOptions_Properties -> ShowS # show :: SparkOptions_Properties -> String # showList :: [SparkOptions_Properties] -> ShowS # | |
Show SparkStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SparkStatistics -> ShowS # show :: SparkStatistics -> String # showList :: [SparkStatistics] -> ShowS # | |
Show SparkStatistics_Endpoints | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> SparkStatistics_Endpoints -> ShowS # show :: SparkStatistics_Endpoints -> String # showList :: [SparkStatistics_Endpoints] -> ShowS # | |
Show StandardSqlDataType | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> StandardSqlDataType -> ShowS # show :: StandardSqlDataType -> String # showList :: [StandardSqlDataType] -> ShowS # | |
Show StandardSqlField | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> StandardSqlField -> ShowS # show :: StandardSqlField -> String # showList :: [StandardSqlField] -> ShowS # | |
Show StandardSqlStructType | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> StandardSqlStructType -> ShowS # show :: StandardSqlStructType -> String # showList :: [StandardSqlStructType] -> ShowS # | |
Show StandardSqlTableType | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> StandardSqlTableType -> ShowS # show :: StandardSqlTableType -> String # showList :: [StandardSqlTableType] -> ShowS # | |
Show Streamingbuffer | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Streamingbuffer -> ShowS # show :: Streamingbuffer -> String # showList :: [Streamingbuffer] -> ShowS # | |
Show StringHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> StringHparamSearchSpace -> ShowS # show :: StringHparamSearchSpace -> String # showList :: [StringHparamSearchSpace] -> ShowS # | |
Show Table | |
Show TableCell | |
Show TableDataInsertAllRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableDataInsertAllRequest -> ShowS # show :: TableDataInsertAllRequest -> String # showList :: [TableDataInsertAllRequest] -> ShowS # | |
Show TableDataInsertAllRequest_RowsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableDataInsertAllRequest_RowsItem -> ShowS # | |
Show TableDataInsertAllResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableDataInsertAllResponse -> ShowS # show :: TableDataInsertAllResponse -> String # showList :: [TableDataInsertAllResponse] -> ShowS # | |
Show TableDataInsertAllResponse_InsertErrorsItem | |
Defined in Gogol.BigQuery.Internal.Product | |
Show TableDataList | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableDataList -> ShowS # show :: TableDataList -> String # showList :: [TableDataList] -> ShowS # | |
Show TableFieldSchema | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableFieldSchema -> ShowS # show :: TableFieldSchema -> String # showList :: [TableFieldSchema] -> ShowS # | |
Show TableFieldSchema_Categories | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableFieldSchema_Categories -> ShowS # show :: TableFieldSchema_Categories -> String # showList :: [TableFieldSchema_Categories] -> ShowS # | |
Show TableFieldSchema_PolicyTags | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableFieldSchema_PolicyTags -> ShowS # show :: TableFieldSchema_PolicyTags -> String # showList :: [TableFieldSchema_PolicyTags] -> ShowS # | |
Show TableList | |
Show TableList_TablesItem | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableList_TablesItem -> ShowS # show :: TableList_TablesItem -> String # showList :: [TableList_TablesItem] -> ShowS # | |
Show TableList_TablesItem_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableList_TablesItem_Labels -> ShowS # show :: TableList_TablesItem_Labels -> String # showList :: [TableList_TablesItem_Labels] -> ShowS # | |
Show TableList_TablesItem_View | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableList_TablesItem_View -> ShowS # show :: TableList_TablesItem_View -> String # showList :: [TableList_TablesItem_View] -> ShowS # | |
Show TableReference | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableReference -> ShowS # show :: TableReference -> String # showList :: [TableReference] -> ShowS # | |
Show TableRow | |
Show TableSchema | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TableSchema -> ShowS # show :: TableSchema -> String # showList :: [TableSchema] -> ShowS # | |
Show Table_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> Table_Labels -> ShowS # show :: Table_Labels -> String # showList :: [Table_Labels] -> ShowS # | |
Show TestIamPermissionsRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TestIamPermissionsRequest -> ShowS # show :: TestIamPermissionsRequest -> String # showList :: [TestIamPermissionsRequest] -> ShowS # | |
Show TestIamPermissionsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TestIamPermissionsResponse -> ShowS # show :: TestIamPermissionsResponse -> String # showList :: [TestIamPermissionsResponse] -> ShowS # | |
Show TimePartitioning | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TimePartitioning -> ShowS # show :: TimePartitioning -> String # showList :: [TimePartitioning] -> ShowS # | |
Show TrainingOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TrainingOptions -> ShowS # show :: TrainingOptions -> String # showList :: [TrainingOptions] -> ShowS # | |
Show TrainingOptions_LabelClassWeights | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TrainingOptions_LabelClassWeights -> ShowS # | |
Show TrainingRun | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TrainingRun -> ShowS # show :: TrainingRun -> String # showList :: [TrainingRun] -> ShowS # | |
Show TransactionInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> TransactionInfo -> ShowS # show :: TransactionInfo -> String # showList :: [TransactionInfo] -> ShowS # | |
Show UserDefinedFunctionResource | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> UserDefinedFunctionResource -> ShowS # show :: UserDefinedFunctionResource -> String # showList :: [UserDefinedFunctionResource] -> ShowS # | |
Show ViewDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods showsPrec :: Int -> ViewDefinition -> ShowS # show :: ViewDefinition -> String # showList :: [ViewDefinition] -> ShowS # | |
Show Argument_ArgumentKind | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Argument_ArgumentKind -> ShowS # show :: Argument_ArgumentKind -> String # showList :: [Argument_ArgumentKind] -> ShowS # | |
Show Argument_Mode | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Argument_Mode -> ShowS # show :: Argument_Mode -> String # showList :: [Argument_Mode] -> ShowS # | |
Show ArimaForecastingMetrics_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Show ArimaModelInfo_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> ArimaModelInfo_SeasonalPeriodsItem -> ShowS # | |
Show ArimaResult_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> ArimaResult_SeasonalPeriodsItem -> ShowS # | |
Show ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem | |
Show AuditLogConfig_LogType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> AuditLogConfig_LogType -> ShowS # show :: AuditLogConfig_LogType -> String # showList :: [AuditLogConfig_LogType] -> ShowS # | |
Show DatasetAccessEntry_TargetTypesItem | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> DatasetAccessEntry_TargetTypesItem -> ShowS # | |
Show HparamTuningTrial_Status | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> HparamTuningTrial_Status -> ShowS # show :: HparamTuningTrial_Status -> String # showList :: [HparamTuningTrial_Status] -> ShowS # | |
Show JobsListProjection | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> JobsListProjection -> ShowS # show :: JobsListProjection -> String # showList :: [JobsListProjection] -> ShowS # | |
Show JobsListStateFilter | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> JobsListStateFilter -> ShowS # show :: JobsListStateFilter -> String # showList :: [JobsListStateFilter] -> ShowS # | |
Show Model_ModelType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Model_ModelType -> ShowS # show :: Model_ModelType -> String # showList :: [Model_ModelType] -> ShowS # | |
Show Routine_DeterminismLevel | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Routine_DeterminismLevel -> ShowS # show :: Routine_DeterminismLevel -> String # showList :: [Routine_DeterminismLevel] -> ShowS # | |
Show Routine_Language | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Routine_Language -> ShowS # show :: Routine_Language -> String # showList :: [Routine_Language] -> ShowS # | |
Show Routine_RoutineType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> Routine_RoutineType -> ShowS # show :: Routine_RoutineType -> String # showList :: [Routine_RoutineType] -> ShowS # | |
Show StandardSqlDataType_TypeKind | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> StandardSqlDataType_TypeKind -> ShowS # show :: StandardSqlDataType_TypeKind -> String # showList :: [StandardSqlDataType_TypeKind] -> ShowS # | |
Show TablesGetView | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TablesGetView -> ShowS # show :: TablesGetView -> String # showList :: [TablesGetView] -> ShowS # | |
Show TrainingOptions_BoosterType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_BoosterType -> ShowS # show :: TrainingOptions_BoosterType -> String # showList :: [TrainingOptions_BoosterType] -> ShowS # | |
Show TrainingOptions_ColorSpace | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_ColorSpace -> ShowS # show :: TrainingOptions_ColorSpace -> String # showList :: [TrainingOptions_ColorSpace] -> ShowS # | |
Show TrainingOptions_DartNormalizeType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_DartNormalizeType -> ShowS # | |
Show TrainingOptions_DataFrequency | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_DataFrequency -> ShowS # show :: TrainingOptions_DataFrequency -> String # showList :: [TrainingOptions_DataFrequency] -> ShowS # | |
Show TrainingOptions_DataSplitMethod | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_DataSplitMethod -> ShowS # | |
Show TrainingOptions_DistanceType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_DistanceType -> ShowS # show :: TrainingOptions_DistanceType -> String # showList :: [TrainingOptions_DistanceType] -> ShowS # | |
Show TrainingOptions_FeedbackType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_FeedbackType -> ShowS # show :: TrainingOptions_FeedbackType -> String # showList :: [TrainingOptions_FeedbackType] -> ShowS # | |
Show TrainingOptions_HolidayRegion | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_HolidayRegion -> ShowS # show :: TrainingOptions_HolidayRegion -> String # showList :: [TrainingOptions_HolidayRegion] -> ShowS # | |
Show TrainingOptions_HparamTuningObjectivesItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Show TrainingOptions_KmeansInitializationMethod | |
Defined in Gogol.BigQuery.Internal.Sum | |
Show TrainingOptions_LearnRateStrategy | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_LearnRateStrategy -> ShowS # | |
Show TrainingOptions_LossType | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_LossType -> ShowS # show :: TrainingOptions_LossType -> String # showList :: [TrainingOptions_LossType] -> ShowS # | |
Show TrainingOptions_OptimizationStrategy | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_OptimizationStrategy -> ShowS # show :: TrainingOptions_OptimizationStrategy -> String # showList :: [TrainingOptions_OptimizationStrategy] -> ShowS # | |
Show TrainingOptions_TreeMethod | |
Defined in Gogol.BigQuery.Internal.Sum Methods showsPrec :: Int -> TrainingOptions_TreeMethod -> ShowS # show :: TrainingOptions_TreeMethod -> String # showList :: [TrainingOptions_TreeMethod] -> ShowS # | |
Show BigQueryJobsCancel | |
Defined in Gogol.BigQuery.Jobs.Cancel Methods showsPrec :: Int -> BigQueryJobsCancel -> ShowS # show :: BigQueryJobsCancel -> String # showList :: [BigQueryJobsCancel] -> ShowS # | |
Show BigQueryJobsDelete | |
Defined in Gogol.BigQuery.Jobs.Delete Methods showsPrec :: Int -> BigQueryJobsDelete -> ShowS # show :: BigQueryJobsDelete -> String # showList :: [BigQueryJobsDelete] -> ShowS # | |
Show BigQueryJobsGet | |
Defined in Gogol.BigQuery.Jobs.Get Methods showsPrec :: Int -> BigQueryJobsGet -> ShowS # show :: BigQueryJobsGet -> String # showList :: [BigQueryJobsGet] -> ShowS # | |
Show BigQueryJobsGetQueryResults | |
Defined in Gogol.BigQuery.Jobs.GetQueryResults Methods showsPrec :: Int -> BigQueryJobsGetQueryResults -> ShowS # show :: BigQueryJobsGetQueryResults -> String # showList :: [BigQueryJobsGetQueryResults] -> ShowS # | |
Show BigQueryJobsInsert | |
Defined in Gogol.BigQuery.Jobs.Insert Methods showsPrec :: Int -> BigQueryJobsInsert -> ShowS # show :: BigQueryJobsInsert -> String # showList :: [BigQueryJobsInsert] -> ShowS # | |
Show BigQueryJobsList | |
Defined in Gogol.BigQuery.Jobs.List Methods showsPrec :: Int -> BigQueryJobsList -> ShowS # show :: BigQueryJobsList -> String # showList :: [BigQueryJobsList] -> ShowS # | |
Show BigQueryJobsQuery | |
Defined in Gogol.BigQuery.Jobs.Query Methods showsPrec :: Int -> BigQueryJobsQuery -> ShowS # show :: BigQueryJobsQuery -> String # showList :: [BigQueryJobsQuery] -> ShowS # | |
Show BigQueryModelsDelete | |
Defined in Gogol.BigQuery.Models.Delete Methods showsPrec :: Int -> BigQueryModelsDelete -> ShowS # show :: BigQueryModelsDelete -> String # showList :: [BigQueryModelsDelete] -> ShowS # | |
Show BigQueryModelsGet | |
Defined in Gogol.BigQuery.Models.Get Methods showsPrec :: Int -> BigQueryModelsGet -> ShowS # show :: BigQueryModelsGet -> String # showList :: [BigQueryModelsGet] -> ShowS # | |
Show BigQueryModelsList | |
Defined in Gogol.BigQuery.Models.List Methods showsPrec :: Int -> BigQueryModelsList -> ShowS # show :: BigQueryModelsList -> String # showList :: [BigQueryModelsList] -> ShowS # | |
Show BigQueryModelsPatch | |
Defined in Gogol.BigQuery.Models.Patch Methods showsPrec :: Int -> BigQueryModelsPatch -> ShowS # show :: BigQueryModelsPatch -> String # showList :: [BigQueryModelsPatch] -> ShowS # | |
Show BigQueryProjectsGetServiceAccount | |
Defined in Gogol.BigQuery.Projects.GetServiceAccount Methods showsPrec :: Int -> BigQueryProjectsGetServiceAccount -> ShowS # | |
Show BigQueryProjectsList | |
Defined in Gogol.BigQuery.Projects.List Methods showsPrec :: Int -> BigQueryProjectsList -> ShowS # show :: BigQueryProjectsList -> String # showList :: [BigQueryProjectsList] -> ShowS # | |
Show BigQueryRoutinesDelete | |
Defined in Gogol.BigQuery.Routines.Delete Methods showsPrec :: Int -> BigQueryRoutinesDelete -> ShowS # show :: BigQueryRoutinesDelete -> String # showList :: [BigQueryRoutinesDelete] -> ShowS # | |
Show BigQueryRoutinesGet | |
Defined in Gogol.BigQuery.Routines.Get Methods showsPrec :: Int -> BigQueryRoutinesGet -> ShowS # show :: BigQueryRoutinesGet -> String # showList :: [BigQueryRoutinesGet] -> ShowS # | |
Show BigQueryRoutinesInsert | |
Defined in Gogol.BigQuery.Routines.Insert Methods showsPrec :: Int -> BigQueryRoutinesInsert -> ShowS # show :: BigQueryRoutinesInsert -> String # showList :: [BigQueryRoutinesInsert] -> ShowS # | |
Show BigQueryRoutinesList | |
Defined in Gogol.BigQuery.Routines.List Methods showsPrec :: Int -> BigQueryRoutinesList -> ShowS # show :: BigQueryRoutinesList -> String # showList :: [BigQueryRoutinesList] -> ShowS # | |
Show BigQueryRoutinesUpdate | |
Defined in Gogol.BigQuery.Routines.Update Methods showsPrec :: Int -> BigQueryRoutinesUpdate -> ShowS # show :: BigQueryRoutinesUpdate -> String # showList :: [BigQueryRoutinesUpdate] -> ShowS # | |
Show BigQueryRowAccessPoliciesGetIamPolicy | |
Defined in Gogol.BigQuery.RowAccessPolicies.GetIamPolicy Methods showsPrec :: Int -> BigQueryRowAccessPoliciesGetIamPolicy -> ShowS # show :: BigQueryRowAccessPoliciesGetIamPolicy -> String # showList :: [BigQueryRowAccessPoliciesGetIamPolicy] -> ShowS # | |
Show BigQueryRowAccessPoliciesList | |
Defined in Gogol.BigQuery.RowAccessPolicies.List Methods showsPrec :: Int -> BigQueryRowAccessPoliciesList -> ShowS # show :: BigQueryRowAccessPoliciesList -> String # showList :: [BigQueryRowAccessPoliciesList] -> ShowS # | |
Show BigQueryRowAccessPoliciesSetIamPolicy | |
Defined in Gogol.BigQuery.RowAccessPolicies.SetIamPolicy Methods showsPrec :: Int -> BigQueryRowAccessPoliciesSetIamPolicy -> ShowS # show :: BigQueryRowAccessPoliciesSetIamPolicy -> String # showList :: [BigQueryRowAccessPoliciesSetIamPolicy] -> ShowS # | |
Show BigQueryRowAccessPoliciesTestIamPermissions | |
Show BigQueryTabledataInsertAll | |
Defined in Gogol.BigQuery.Tabledata.InsertAll Methods showsPrec :: Int -> BigQueryTabledataInsertAll -> ShowS # show :: BigQueryTabledataInsertAll -> String # showList :: [BigQueryTabledataInsertAll] -> ShowS # | |
Show BigQueryTabledataList | |
Defined in Gogol.BigQuery.Tabledata.List Methods showsPrec :: Int -> BigQueryTabledataList -> ShowS # show :: BigQueryTabledataList -> String # showList :: [BigQueryTabledataList] -> ShowS # | |
Show BigQueryTablesDelete | |
Defined in Gogol.BigQuery.Tables.Delete Methods showsPrec :: Int -> BigQueryTablesDelete -> ShowS # show :: BigQueryTablesDelete -> String # showList :: [BigQueryTablesDelete] -> ShowS # | |
Show BigQueryTablesGet | |
Defined in Gogol.BigQuery.Tables.Get Methods showsPrec :: Int -> BigQueryTablesGet -> ShowS # show :: BigQueryTablesGet -> String # showList :: [BigQueryTablesGet] -> ShowS # | |
Show BigQueryTablesGetIamPolicy | |
Defined in Gogol.BigQuery.Tables.GetIamPolicy Methods showsPrec :: Int -> BigQueryTablesGetIamPolicy -> ShowS # show :: BigQueryTablesGetIamPolicy -> String # showList :: [BigQueryTablesGetIamPolicy] -> ShowS # | |
Show BigQueryTablesInsert | |
Defined in Gogol.BigQuery.Tables.Insert Methods showsPrec :: Int -> BigQueryTablesInsert -> ShowS # show :: BigQueryTablesInsert -> String # showList :: [BigQueryTablesInsert] -> ShowS # | |
Show BigQueryTablesList | |
Defined in Gogol.BigQuery.Tables.List Methods showsPrec :: Int -> BigQueryTablesList -> ShowS # show :: BigQueryTablesList -> String # showList :: [BigQueryTablesList] -> ShowS # | |
Show BigQueryTablesPatch | |
Defined in Gogol.BigQuery.Tables.Patch Methods showsPrec :: Int -> BigQueryTablesPatch -> ShowS # show :: BigQueryTablesPatch -> String # showList :: [BigQueryTablesPatch] -> ShowS # | |
Show BigQueryTablesSetIamPolicy | |
Defined in Gogol.BigQuery.Tables.SetIamPolicy Methods showsPrec :: Int -> BigQueryTablesSetIamPolicy -> ShowS # show :: BigQueryTablesSetIamPolicy -> String # showList :: [BigQueryTablesSetIamPolicy] -> ShowS # | |
Show BigQueryTablesTestIamPermissions | |
Defined in Gogol.BigQuery.Tables.TestIamPermissions Methods showsPrec :: Int -> BigQueryTablesTestIamPermissions -> ShowS # | |
Show BigQueryTablesUpdate | |
Defined in Gogol.BigQuery.Tables.Update Methods showsPrec :: Int -> BigQueryTablesUpdate -> ShowS # show :: BigQueryTablesUpdate -> String # showList :: [BigQueryTablesUpdate] -> ShowS # | |
Show Base64 | |
Show Date | |
Show DateTime | |
Show Duration | |
Show Time | |
Show AccessToken | |
Defined in Gogol.Types Methods showsPrec :: Int -> AccessToken -> ShowS # show :: AccessToken -> String # showList :: [AccessToken] -> ShowS # | |
Show AltJSON | |
Show AltMedia | |
Show ClientId | |
Show Error | |
Show FieldMask | |
Show GSecret | |
Show Multipart | |
Show OAuthScope | |
Defined in Gogol.Types Methods showsPrec :: Int -> OAuthScope -> ShowS # show :: OAuthScope -> String # showList :: [OAuthScope] -> ShowS # | |
Show RefreshToken | |
Defined in Gogol.Types Methods showsPrec :: Int -> RefreshToken -> ShowS # show :: RefreshToken -> String # showList :: [RefreshToken] -> ShowS # | |
Show Seconds | |
Show SerializeError | |
Defined in Gogol.Types Methods showsPrec :: Int -> SerializeError -> ShowS # show :: SerializeError -> String # showList :: [SerializeError] -> ShowS # | |
Show ServiceError | |
Defined in Gogol.Types Methods showsPrec :: Int -> ServiceError -> ShowS # show :: ServiceError -> String # showList :: [ServiceError] -> ShowS # | |
Show ServiceId | |
Show SrcLoc | |
Show SrcSpan | |
Show SrcSpanInfo | |
Defined in Language.Haskell.Exts.SrcLoc Methods showsPrec :: Int -> SrcSpanInfo -> ShowS # show :: SrcSpanInfo -> String # showList :: [SrcSpanInfo] -> ShowS # | |
Show Boxed | |
Show Tool | |
Show AccessToken | |
Defined in Network.OAuth.OAuth2.Internal Methods showsPrec :: Int -> AccessToken -> ShowS # show :: AccessToken -> String # showList :: [AccessToken] -> ShowS # | |
Show ExchangeToken | |
Defined in Network.OAuth.OAuth2.Internal Methods showsPrec :: Int -> ExchangeToken -> ShowS # show :: ExchangeToken -> String # showList :: [ExchangeToken] -> ShowS # | |
Show IdToken | |
Show OAuth2 | |
Show OAuth2Token | |
Defined in Network.OAuth.OAuth2.Internal Methods showsPrec :: Int -> OAuth2Token -> ShowS # show :: OAuth2Token -> String # showList :: [OAuth2Token] -> ShowS # | |
Show RefreshToken | |
Defined in Network.OAuth.OAuth2.Internal Methods showsPrec :: Int -> RefreshToken -> ShowS # show :: RefreshToken -> String # showList :: [RefreshToken] -> ShowS # | |
Show IdpName | |
Show GoogleUser | |
Defined in Network.OAuth2.Provider.Google Methods showsPrec :: Int -> GoogleUser -> ShowS # show :: GoogleUser -> String # showList :: [GoogleUser] -> ShowS # | |
Show Tix | |
Show TixModule | |
Show Hash | |
Show HpcPos | |
Show Form | |
Show EncapsulatedPopperException | |
Show ConnHost | |
Show ConnKey | |
Show Cookie | |
Show CookieJar | |
Show HttpException | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> HttpException -> ShowS # show :: HttpException -> String # showList :: [HttpException] -> ShowS # | |
Show HttpExceptionContent | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> HttpExceptionContent -> ShowS # show :: HttpExceptionContent -> String # showList :: [HttpExceptionContent] -> ShowS # | |
Show HttpExceptionContentWrapper | |
Show MaxHeaderLength | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> MaxHeaderLength -> ShowS # show :: MaxHeaderLength -> String # showList :: [MaxHeaderLength] -> ShowS # | |
Show Proxy | |
Show ProxySecureMode | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> ProxySecureMode -> ShowS # show :: ProxySecureMode -> String # showList :: [ProxySecureMode] -> ShowS # | |
Show Request | |
Show ResponseClose | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> ResponseClose -> ShowS # show :: ResponseClose -> String # showList :: [ResponseClose] -> ShowS # | |
Show ResponseTimeout | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> ResponseTimeout -> ShowS # show :: ResponseTimeout -> String # showList :: [ResponseTimeout] -> ShowS # | |
Show StatusHeaders | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> StatusHeaders -> ShowS # show :: StatusHeaders -> String # showList :: [StatusHeaders] -> ShowS # | |
Show StreamFileStatus | |
Defined in Network.HTTP.Client.Types Methods showsPrec :: Int -> StreamFileStatus -> ShowS # show :: StreamFileStatus -> String # showList :: [StreamFileStatus] -> ShowS # | |
Show ByteRange | Since: http-types-0.8.4 |
Show StdMethod | |
Show Status | |
Show HttpVersion |
|
Defined in Network.HTTP.Types.Version Methods showsPrec :: Int -> HttpVersion -> ShowS # show :: HttpVersion -> String # showList :: [HttpVersion] -> ShowS # | |
Show IP | |
Show IPv4 | |
Show IPv6 | |
Show IPRange | |
Show Alg | |
Show Enc | |
Show JweAlg | |
Show JwsAlg | |
Show EcCurve | |
Show Jwk | |
Show JwkBytes | |
Show JwkSet | |
Show KeyUse | |
Show IntDate | |
Show JweHeader | |
Show JwsHeader | |
Show Jwt | |
Show JwtClaims | |
Show JwtContent | |
Defined in Jose.Types Methods showsPrec :: Int -> JwtContent -> ShowS # show :: JwtContent -> String # showList :: [JwtContent] -> ShowS # | |
Show JwtEncoding | |
Defined in Jose.Types Methods showsPrec :: Int -> JwtEncoding -> ShowS # show :: JwtEncoding -> String # showList :: [JwtEncoding] -> ShowS # | |
Show JwtError | |
Show JwtHeader | |
Show KeyId | |
Show Payload | |
Show Environment | |
Defined in Katip.Core Methods showsPrec :: Int -> Environment -> ShowS # show :: Environment -> String # showList :: [Environment] -> ShowS # | |
Show LocShow | |
Show LogStr | |
Show Namespace | |
Show PayloadSelection | |
Defined in Katip.Core Methods showsPrec :: Int -> PayloadSelection -> ShowS # show :: PayloadSelection -> String # showList :: [PayloadSelection] -> ShowS # | |
Show ScribeSettings | |
Defined in Katip.Core Methods showsPrec :: Int -> ScribeSettings -> ShowS # show :: ScribeSettings -> String # showList :: [ScribeSettings] -> ShowS # | |
Show Severity | |
Show ThreadIdText | |
Defined in Katip.Core Methods showsPrec :: Int -> ThreadIdText -> ShowS # show :: ThreadIdText -> String # showList :: [ThreadIdText] -> ShowS # | |
Show Verbosity | |
Show ColorStrategy | |
Defined in Katip.Scribes.Handle Methods showsPrec :: Int -> ColorStrategy -> ShowS # show :: ColorStrategy -> String # showList :: [ColorStrategy] -> ShowS # | |
Show HandlingException | |
Defined in Control.Lens.Internal.Exception Methods showsPrec :: Int -> HandlingException -> ShowS # show :: HandlingException -> String # showList :: [HandlingException] -> ShowS # | |
Show DefName | |
Show InvalidPosException | |
Defined in Text.Megaparsec.Pos Methods showsPrec :: Int -> InvalidPosException -> ShowS # show :: InvalidPosException -> String # showList :: [InvalidPosException] -> ShowS # | |
Show Pos | |
Show SourcePos | |
Show NullError | |
Show SpecMetaArgsOpt # | |
Defined in Napkin.Cli.SpecMetaArgs Methods showsPrec :: Int -> SpecMetaArgsOpt -> ShowS # show :: SpecMetaArgsOpt -> String # showList :: [SpecMetaArgsOpt] -> ShowS # | |
Show SpecFileArrayMergeStrategy # | |
Defined in Napkin.Cli.Types Methods showsPrec :: Int -> SpecFileArrayMergeStrategy -> ShowS # show :: SpecFileArrayMergeStrategy -> String # showList :: [SpecFileArrayMergeStrategy] -> ShowS # | |
Show SpecFileWithMergeStrategy # | |
Defined in Napkin.Cli.Types Methods showsPrec :: Int -> SpecFileWithMergeStrategy -> ShowS # show :: SpecFileWithMergeStrategy -> String # showList :: [SpecFileWithMergeStrategy] -> ShowS # | |
Show SpecFilesWithOverrides # | |
Defined in Napkin.Cli.Types Methods showsPrec :: Int -> SpecFilesWithOverrides -> ShowS # show :: SpecFilesWithOverrides -> String # showList :: [SpecFilesWithOverrides] -> ShowS # | |
Show CompareCount # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods showsPrec :: Int -> CompareCount -> ShowS # show :: CompareCount -> String # showList :: [CompareCount] -> ShowS # | |
Show CountTolerance # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods showsPrec :: Int -> CountTolerance -> ShowS # show :: CountTolerance -> String # showList :: [CountTolerance] -> ShowS # | |
Show AddedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> AddedColumnPolicy -> ShowS # show :: AddedColumnPolicy -> String # showList :: [AddedColumnPolicy] -> ShowS # | |
Show DroppedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> DroppedColumnPolicy -> ShowS # show :: DroppedColumnPolicy -> String # showList :: [DroppedColumnPolicy] -> ShowS # | |
Show SchemaMigrationOptions # | |
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> SchemaMigrationOptions -> ShowS # show :: SchemaMigrationOptions -> String # showList :: [SchemaMigrationOptions] -> ShowS # | |
Show AuthEvalError | |
Defined in Napkin.Auth.Types Methods showsPrec :: Int -> AuthEvalError -> ShowS # show :: AuthEvalError -> String # showList :: [AuthEvalError] -> ShowS # | |
Show Dollars | |
Show InvalidBigQueryRef | |
Defined in Napkin.Run.BigQuery.Context Methods showsPrec :: Int -> InvalidBigQueryRef -> ShowS # show :: InvalidBigQueryRef -> String # showList :: [InvalidBigQueryRef] -> ShowS # | |
Show BQTableContext | |
Defined in Napkin.Run.BigQuery.Types Methods showsPrec :: Int -> BQTableContext -> ShowS # show :: BQTableContext -> String # showList :: [BQTableContext] -> ShowS # | |
Show BigQueryRunError | |
Defined in Napkin.Run.BigQuery.Types Methods showsPrec :: Int -> BigQueryRunError -> ShowS # show :: BigQueryRunError -> String # showList :: [BigQueryRunError] -> ShowS # | |
Show DatasetIsMissing | |
Defined in Napkin.Run.BigQuery.Types Methods showsPrec :: Int -> DatasetIsMissing -> ShowS # show :: DatasetIsMissing -> String # showList :: [DatasetIsMissing] -> ShowS # | |
Show StarExpansionNotSupported | |
Defined in Napkin.Run.BigQuery.Types Methods showsPrec :: Int -> StarExpansionNotSupported -> ShowS # show :: StarExpansionNotSupported -> String # showList :: [StarExpansionNotSupported] -> ShowS # | |
Show BQDataSetId | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> BQDataSetId -> ShowS # show :: BQDataSetId -> String # showList :: [BQDataSetId] -> ShowS # | |
Show BQDataSetReference | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> BQDataSetReference -> ShowS # show :: BQDataSetReference -> String # showList :: [BQDataSetReference] -> ShowS # | |
Show BQProjectId | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> BQProjectId -> ShowS # show :: BQProjectId -> String # showList :: [BQProjectId] -> ShowS # | |
Show BQTableId | |
Show BigQueryType | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> BigQueryType -> ShowS # show :: BigQueryType -> String # showList :: [BigQueryType] -> ShowS # | |
Show MaterializedViewMeta | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> MaterializedViewMeta -> ShowS # show :: MaterializedViewMeta -> String # showList :: [MaterializedViewMeta] -> ShowS # | |
Show MaterializedViewRefresh | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> MaterializedViewRefresh -> ShowS # show :: MaterializedViewRefresh -> String # showList :: [MaterializedViewRefresh] -> ShowS # | |
Show PartitionInterval | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> PartitionInterval -> ShowS # show :: PartitionInterval -> String # showList :: [PartitionInterval] -> ShowS # | |
Show RangeWithStep | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> RangeWithStep -> ShowS # show :: RangeWithStep -> String # showList :: [RangeWithStep] -> ShowS # | |
Show TableMeta | |
Show TablePartitioning | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> TablePartitioning -> ShowS # show :: TablePartitioning -> String # showList :: [TablePartitioning] -> ShowS # | |
Show TimePartitioning | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> TimePartitioning -> ShowS # show :: TimePartitioning -> String # showList :: [TimePartitioning] -> ShowS # | |
Show ViewMeta | |
Show WriteDisposition | |
Defined in Napkin.Types.BigQuery Methods showsPrec :: Int -> WriteDisposition -> ShowS # show :: WriteDisposition -> String # showList :: [WriteDisposition] -> ShowS # | |
Show JoinOnPredicate | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods showsPrec :: Int -> JoinOnPredicate -> ShowS # show :: JoinOnPredicate -> String # showList :: [JoinOnPredicate] -> ShowS # | |
Show Merge | |
Show TableAlias | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods showsPrec :: Int -> TableAlias -> ShowS # show :: TableAlias -> String # showList :: [TableAlias] -> ShowS # | |
Show WhenMatched | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods showsPrec :: Int -> WhenMatched -> ShowS # show :: WhenMatched -> String # showList :: [WhenMatched] -> ShowS # | |
Show WhenNotMatched | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods showsPrec :: Int -> WhenNotMatched -> ShowS # show :: WhenNotMatched -> String # showList :: [WhenNotMatched] -> ShowS # | |
Show JSONPath | |
Show MsSchemaField | |
Defined in Napkin.Types.MsSql Methods showsPrec :: Int -> MsSchemaField -> ShowS # show :: MsSchemaField -> String # showList :: [MsSchemaField] -> ShowS # | |
Show MsSqlMaterializedViewMeta | |
Defined in Napkin.Types.MsSql Methods showsPrec :: Int -> MsSqlMaterializedViewMeta -> ShowS # show :: MsSqlMaterializedViewMeta -> String # showList :: [MsSqlMaterializedViewMeta] -> ShowS # | |
Show SetTableSchema | |
Defined in Napkin.Types.MsSql Methods showsPrec :: Int -> SetTableSchema -> ShowS # show :: SetTableSchema -> String # showList :: [SetTableSchema] -> ShowS # | |
Show PGSchemaField | |
Defined in Napkin.Run.PGCommon Methods showsPrec :: Int -> PGSchemaField -> ShowS # show :: PGSchemaField -> String # showList :: [PGSchemaField] -> ShowS # | |
Show PrettySqlError | |
Defined in Napkin.Run.PGCommon Methods showsPrec :: Int -> PrettySqlError -> ShowS # show :: PrettySqlError -> String # showList :: [PrettySqlError] -> ShowS # | |
Show CreateIndex | |
Defined in Napkin.Types.Postgres Methods showsPrec :: Int -> CreateIndex -> ShowS # show :: CreateIndex -> String # showList :: [CreateIndex] -> ShowS # | |
Show MaterializedViewMeta | |
Defined in Napkin.Types.Postgres Methods showsPrec :: Int -> MaterializedViewMeta -> ShowS # show :: MaterializedViewMeta -> String # showList :: [MaterializedViewMeta] -> ShowS # | |
Show SetTableSchema | |
Defined in Napkin.Types.Postgres Methods showsPrec :: Int -> SetTableSchema -> ShowS # show :: SetTableSchema -> String # showList :: [SetTableSchema] -> ShowS # | |
Show TableMeta | |
Show Index | |
Show ContinuousAggregatePolicy | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> ContinuousAggregatePolicy -> ShowS # show :: ContinuousAggregatePolicy -> String # showList :: [ContinuousAggregatePolicy] -> ShowS # | |
Show ContinuousViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> ContinuousViewMeta -> ShowS # show :: ContinuousViewMeta -> String # showList :: [ContinuousViewMeta] -> ShowS # | |
Show RetentionPolicy | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> RetentionPolicy -> ShowS # show :: RetentionPolicy -> String # showList :: [RetentionPolicy] -> ShowS # | |
Show TimescaleViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> TimescaleViewMeta -> ShowS # show :: TimescaleViewMeta -> String # showList :: [TimescaleViewMeta] -> ShowS # | |
Show DistStyle | |
Show SortKey | |
Show SortStyle | |
Show TableMeta | |
Show CaseSensitivity | |
Defined in Napkin.Untyped.Ops.Redshift Methods showsPrec :: Int -> CaseSensitivity -> ShowS # show :: CaseSensitivity -> String # showList :: [CaseSensitivity] -> ShowS # | |
Show SqliteSchemaError | |
Defined in Napkin.Run.Sqlite Methods showsPrec :: Int -> SqliteSchemaError -> ShowS # show :: SqliteSchemaError -> String # showList :: [SqliteSchemaError] -> ShowS # | |
Show SqliteMaterializedViewMeta | |
Defined in Napkin.Types.Sqlite Methods showsPrec :: Int -> SqliteMaterializedViewMeta -> ShowS # show :: SqliteMaterializedViewMeta -> String # showList :: [SqliteMaterializedViewMeta] -> ShowS # | |
Show AggLevel | |
Show ArrayBase | |
Show AsStruct | |
Show CteBody | |
Show DatePart | |
Show Distinctness | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> Distinctness -> ShowS # show :: Distinctness -> String # showList :: [Distinctness] -> ShowS # | |
Show ExternFun | |
Show FrameLength | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> FrameLength -> ShowS # show :: FrameLength -> String # showList :: [FrameLength] -> ShowS # | |
Show From | |
Show FunModifier | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> FunModifier -> ShowS # show :: FunModifier -> String # showList :: [FunModifier] -> ShowS # | |
Show IntInterval | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> IntInterval -> ShowS # show :: IntInterval -> String # showList :: [IntInterval] -> ShowS # | |
Show Interval | |
Show JoinType | |
Show Name | |
Show NativeExpr | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NativeExpr -> ShowS # show :: NativeExpr -> String # showList :: [NativeExpr] -> ShowS # | |
Show NativeQuery | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NativeQuery -> ShowS # show :: NativeQuery -> String # showList :: [NativeQuery] -> ShowS # | |
Show NullOrder | |
Show NullStrategy | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NullStrategy -> ShowS # show :: NullStrategy -> String # showList :: [NullStrategy] -> ShowS # | |
Show Nullability | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> Nullability -> ShowS # show :: Nullability -> String # showList :: [Nullability] -> ShowS # | |
Show OrderDir | |
Show OrderPart | |
Show ParensOperator | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> ParensOperator -> ShowS # show :: ParensOperator -> String # showList :: [ParensOperator] -> ShowS # | |
Show ParensOperatorArgument | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> ParensOperatorArgument -> ShowS # show :: ParensOperatorArgument -> String # showList :: [ParensOperatorArgument] -> ShowS # | |
Show Query | |
Show RawQuery | |
Show Relation | |
Show SExp | |
Show SpecDependency | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> SpecDependency -> ShowS # show :: SpecDependency -> String # showList :: [SpecDependency] -> ShowS # | |
Show SpecNode | |
Show SpecTableName | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> SpecTableName -> ShowS # show :: SpecTableName -> String # showList :: [SpecTableName] -> ShowS # | |
Show StructField | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> StructField -> ShowS # show :: StructField -> String # showList :: [StructField] -> ShowS # | |
Show TableKind | |
Show Type | |
Show UnionType | |
Show UpdateQuery | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> UpdateQuery -> ShowS # show :: UpdateQuery -> String # showList :: [UpdateQuery] -> ShowS # | |
Show Value | |
Show WOver | |
Show WindowFrame | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WindowFrame -> ShowS # show :: WindowFrame -> String # showList :: [WindowFrame] -> ShowS # | |
Show WindowFrameUnit | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WindowFrameUnit -> ShowS # show :: WindowFrameUnit -> String # showList :: [WindowFrameUnit] -> ShowS # | |
Show WithClauses | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WithClauses -> ShowS # show :: WithClauses -> String # showList :: [WithClauses] -> ShowS # | |
Show DefinedCTEs | |
Show Dependencies | |
Show Estimate | |
Show ComBombShell | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> ComBombShell -> ShowS # show :: ComBombShell -> String # showList :: [ComBombShell] -> ShowS # | |
Show GenFunctionOpt | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> GenFunctionOpt -> ShowS # show :: GenFunctionOpt -> String # showList :: [GenFunctionOpt] -> ShowS # | |
Show JsonNullStrategy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> JsonNullStrategy -> ShowS # show :: JsonNullStrategy -> String # showList :: [JsonNullStrategy] -> ShowS # | |
Show MsSqlApiDefExpr | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> MsSqlApiDefExpr -> ShowS # show :: MsSqlApiDefExpr -> String # showList :: [MsSqlApiDefExpr] -> ShowS # | |
Show MsSqlApiParserSt | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> MsSqlApiParserSt -> ShowS # show :: MsSqlApiParserSt -> String # showList :: [MsSqlApiParserSt] -> ShowS # | |
Show MsSqlApiUnitDef | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> MsSqlApiUnitDef -> ShowS # show :: MsSqlApiUnitDef -> String # showList :: [MsSqlApiUnitDef] -> ShowS # | |
Show NthHtmlNode | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> NthHtmlNode -> ShowS # show :: NthHtmlNode -> String # showList :: [NthHtmlNode] -> ShowS # | |
Show NthStmtInHtmlNode | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> NthStmtInHtmlNode -> ShowS # show :: NthStmtInHtmlNode -> String # showList :: [NthStmtInHtmlNode] -> ShowS # | |
Show OverOrderBy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> OverOrderBy -> ShowS # show :: OverOrderBy -> String # showList :: [OverOrderBy] -> ShowS # | |
Show OverOrderByField | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> OverOrderByField -> ShowS # show :: OverOrderByField -> String # showList :: [OverOrderByField] -> ShowS # | |
Show PartitionBy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> PartitionBy -> ShowS # show :: PartitionBy -> String # showList :: [PartitionBy] -> ShowS # | |
Show RowRange | |
Show RowRangeBound | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> RowRangeBound -> ShowS # show :: RowRangeBound -> String # showList :: [RowRangeBound] -> ShowS # | |
Show SubDefMeta | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods showsPrec :: Int -> SubDefMeta -> ShowS # show :: SubDefMeta -> String # showList :: [SubDefMeta] -> ShowS # | |
Show LogLineFormat | |
Defined in Napkin.Logging Methods showsPrec :: Int -> LogLineFormat -> ShowS # show :: LogLineFormat -> String # showList :: [LogLineFormat] -> ShowS # | |
Show LogOptions | |
Defined in Napkin.Logging Methods showsPrec :: Int -> LogOptions -> ShowS # show :: LogOptions -> String # showList :: [LogOptions] -> ShowS # | |
Show LogTarget | |
Show SQLDialect | |
Defined in Napkin.Parse.Base Methods showsPrec :: Int -> SQLDialect -> ShowS # show :: SQLDialect -> String # showList :: [SQLDialect] -> ShowS # | |
Show InterpolationError | |
Defined in Napkin.Parse.Interpolation.Types Methods showsPrec :: Int -> InterpolationError -> ShowS # show :: InterpolationError -> String # showList :: [InterpolationError] -> ShowS # | |
Show InterpolationErrorDetails | |
Defined in Napkin.Parse.Interpolation.Types Methods showsPrec :: Int -> InterpolationErrorDetails -> ShowS # show :: InterpolationErrorDetails -> String # showList :: [InterpolationErrorDetails] -> ShowS # | |
Show InterpolationMode | |
Defined in Napkin.Parse.Interpolation.Types Methods showsPrec :: Int -> InterpolationMode -> ShowS # show :: InterpolationMode -> String # showList :: [InterpolationMode] -> ShowS # | |
Show SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods showsPrec :: Int -> SqlTemplateVariables -> ShowS # show :: SqlTemplateVariables -> String # showList :: [SqlTemplateVariables] -> ShowS # | |
Show ParseExc | |
Show SimpleSQLParserDialect | |
Defined in Napkin.Parse.SimpleSqlParser.Dialect Methods showsPrec :: Int -> SimpleSQLParserDialect -> ShowS # show :: SimpleSQLParserDialect -> String # showList :: [SimpleSQLParserDialect] -> ShowS # | |
Show Unshow | |
Show RenderingError | |
Defined in Napkin.Revert.Types Methods showsPrec :: Int -> RenderingError -> ShowS # show :: RenderingError -> String # showList :: [RenderingError] -> ShowS # | |
Show Artifacts | |
Show Dependencies | |
Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types Methods showsPrec :: Int -> Dependencies -> ShowS # show :: Dependencies -> String # showList :: [Dependencies] -> ShowS # | |
Show IState | |
Show AssertionEntry | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionEntry -> ShowS # show :: AssertionEntry -> String # showList :: [AssertionEntry] -> ShowS # | |
Show AssertionGroup | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionGroup -> ShowS # show :: AssertionGroup -> String # showList :: [AssertionGroup] -> ShowS # | |
Show AssertionLog | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionLog -> ShowS # show :: AssertionLog -> String # showList :: [AssertionLog] -> ShowS # | |
Show AssertionSeverity | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionSeverity -> ShowS # show :: AssertionSeverity -> String # showList :: [AssertionSeverity] -> ShowS # | |
Show AssertionStatus | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionStatus -> ShowS # show :: AssertionStatus -> String # showList :: [AssertionStatus] -> ShowS # | |
Show ExternalCommand | |
Defined in Napkin.Run.Effects.Languages.External Methods showsPrec :: Int -> ExternalCommand -> ShowS # show :: ExternalCommand -> String # showList :: [ExternalCommand] -> ShowS # | |
Show LoadQueryError | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods showsPrec :: Int -> LoadQueryError -> ShowS # show :: LoadQueryError -> String # showList :: [LoadQueryError] -> ShowS # | |
Show LocalFileError | |
Defined in Napkin.Run.Effects.Languages.LocalFile Methods showsPrec :: Int -> LocalFileError -> ShowS # show :: LocalFileError -> String # showList :: [LocalFileError] -> ShowS # | |
Show NapkinEffectError | |
Defined in Napkin.Run.Effects.Languages.NapkinError Methods showsPrec :: Int -> NapkinEffectError -> ShowS # show :: NapkinEffectError -> String # showList :: [NapkinEffectError] -> ShowS # | |
Show SqlParseError | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods showsPrec :: Int -> SqlParseError -> ShowS # show :: SqlParseError -> String # showList :: [SqlParseError] -> ShowS # | |
Show Cascade | |
Show InsertColumnsList | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> InsertColumnsList -> ShowS # show :: InsertColumnsList -> String # showList :: [InsertColumnsList] -> ShowS # | |
Show MissingBehavior | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> MissingBehavior -> ShowS # show :: MissingBehavior -> String # showList :: [MissingBehavior] -> ShowS # | |
Show TableWriteStrategy | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> TableWriteStrategy -> ShowS # show :: TableWriteStrategy -> String # showList :: [TableWriteStrategy] -> ShowS # | |
Show CreateTableDDL | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> CreateTableDDL -> ShowS # show :: CreateTableDDL -> String # showList :: [CreateTableDDL] -> ShowS # | |
Show ExtendedStatement | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> ExtendedStatement -> ShowS # show :: ExtendedStatement -> String # showList :: [ExtendedStatement] -> ShowS # | |
Show InsertStatement | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> InsertStatement -> ShowS # show :: InsertStatement -> String # showList :: [InsertStatement] -> ShowS # | |
Show ExtraDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> ExtraDependencies -> ShowS # show :: ExtraDependencies -> String # showList :: [ExtraDependencies] -> ShowS # | |
Show HiddenArtifacts | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> HiddenArtifacts -> ShowS # show :: HiddenArtifacts -> String # showList :: [HiddenArtifacts] -> ShowS # | |
Show HiddenDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> HiddenDependencies -> ShowS # show :: HiddenDependencies -> String # showList :: [HiddenDependencies] -> ShowS # | |
Show MetaArguments | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> MetaArguments -> ShowS # show :: MetaArguments -> String # showList :: [MetaArguments] -> ShowS # | |
Show TableMemo | |
Show TemplateError | |
Defined in Napkin.Run.Effects.Languages.Template Methods showsPrec :: Int -> TemplateError -> ShowS # show :: TemplateError -> String # showList :: [TemplateError] -> ShowS # | |
Show RenamerSchemaOverwriteBehavior | |
Defined in Napkin.Run.Effects.Preprocessor Methods showsPrec :: Int -> RenamerSchemaOverwriteBehavior -> ShowS # show :: RenamerSchemaOverwriteBehavior -> String # showList :: [RenamerSchemaOverwriteBehavior] -> ShowS # | |
Show RenamerScope | |
Defined in Napkin.Run.Effects.Preprocessor Methods showsPrec :: Int -> RenamerScope -> ShowS # show :: RenamerScope -> String # showList :: [RenamerScope] -> ShowS # | |
Show HookSyncOrAsync | |
Defined in Napkin.Run.Effects.Types Methods showsPrec :: Int -> HookSyncOrAsync -> ShowS # show :: HookSyncOrAsync -> String # showList :: [HookSyncOrAsync] -> ShowS # | |
Show HaskellEvaluationError | |
Defined in Napkin.Run.Types.ErrorReporting Methods showsPrec :: Int -> HaskellEvaluationError -> ShowS # show :: HaskellEvaluationError -> String # showList :: [HaskellEvaluationError] -> ShowS # | |
Show NapkinError | |
Defined in Napkin.Run.Types.ErrorReporting Methods showsPrec :: Int -> NapkinError -> ShowS # show :: NapkinError -> String # showList :: [NapkinError] -> ShowS # | |
Show ValidationError | |
Defined in Napkin.Run.Types.ErrorReporting Methods showsPrec :: Int -> ValidationError -> ShowS # show :: ValidationError -> String # showList :: [ValidationError] -> ShowS # | |
Show SourceLocation | |
Defined in Napkin.Run.Types.SourceLocation Methods showsPrec :: Int -> SourceLocation -> ShowS # show :: SourceLocation -> String # showList :: [SourceLocation] -> ShowS # | |
Show AppName | |
Show AuthSpecFile | |
Defined in Napkin.Spec.Types.Runtime Methods showsPrec :: Int -> AuthSpecFile -> ShowS # show :: AuthSpecFile -> String # showList :: [AuthSpecFile] -> ShowS # | |
Show BkStatistics | |
Defined in Napkin.Spec.Types.Runtime Methods showsPrec :: Int -> BkStatistics -> ShowS # show :: BkStatistics -> String # showList :: [BkStatistics] -> ShowS # | |
Show UpdateStrategy | |
Defined in Napkin.Spec.Types.Spec Methods showsPrec :: Int -> UpdateStrategy -> ShowS # show :: UpdateStrategy -> String # showList :: [UpdateStrategy] -> ShowS # | |
Show SpecProgramArgumentDefaultValue | |
Defined in Napkin.Spec.Yaml.Types.Arguments Methods showsPrec :: Int -> SpecProgramArgumentDefaultValue -> ShowS # | |
Show QState | |
Show RefStore | |
Show UState | |
Show BackendFunctionMeta | |
Defined in Napkin.Untyped.Ops Methods showsPrec :: Int -> BackendFunctionMeta -> ShowS # show :: BackendFunctionMeta -> String # showList :: [BackendFunctionMeta] -> ShowS # | |
Show FileType | |
Show BrowserException | |
Defined in Napkin.Utils.Web Methods showsPrec :: Int -> BrowserException -> ShowS # show :: BrowserException -> String # showList :: [BrowserException] -> ShowS # | |
Show AddrInfo | |
Show AddrInfoFlag | |
Defined in Network.Socket.Info Methods showsPrec :: Int -> AddrInfoFlag -> ShowS # show :: AddrInfoFlag -> String # showList :: [AddrInfoFlag] -> ShowS # | |
Show NameInfoFlag | |
Defined in Network.Socket.Info Methods showsPrec :: Int -> NameInfoFlag -> ShowS # show :: NameInfoFlag -> String # showList :: [NameInfoFlag] -> ShowS # | |
Show URI | |
Show URIAuth | |
Show Binary | |
Show Column | |
Show ODBCException | |
Defined in Database.ODBC.Internal Methods showsPrec :: Int -> ODBCException -> ShowS # show :: ODBCException -> String # showList :: [ODBCException] -> ShowS # | |
Show Param | |
Show RETCODE | |
Show SQLCHAR | |
Show SQLCTYPE | |
Show SQLINTEGER | |
Show SQLLEN | |
Show SQLSMALLINT | |
Show SQLUCHAR | |
Show SQLUINTEGER | |
Show SQLULEN | |
Show SQLUSMALLINT | |
Show SQLWCHAR | |
Show Value | |
Show Datetime2 | |
Show Datetimeoffset | |
Defined in Database.ODBC.SQLServer Methods showsPrec :: Int -> Datetimeoffset -> ShowS # show :: Datetimeoffset -> String # showList :: [Datetimeoffset] -> ShowS # | |
Show FPart | |
Show Part | |
Show Query | |
Show Smalldatetime | |
Defined in Database.ODBC.SQLServer Methods showsPrec :: Int -> Smalldatetime -> ShowS # show :: Smalldatetime -> String # showList :: [Smalldatetime] -> ShowS # | |
Show Richness | |
Show Parenthetic | |
Show ParserHelp | |
Defined in Options.Applicative.Help.Types Methods showsPrec :: Int -> ParserHelp -> ShowS # show :: ParserHelp -> String # showList :: [ParserHelp] -> ShowS # | |
Show AltNodeType | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> AltNodeType -> ShowS # show :: AltNodeType -> String # showList :: [AltNodeType] -> ShowS # | |
Show ArgPolicy | |
Show ArgumentReachability | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> ArgumentReachability -> ShowS # show :: ArgumentReachability -> String # showList :: [ArgumentReachability] -> ShowS # | |
Show Backtracking | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> Backtracking -> ShowS # show :: Backtracking -> String # showList :: [Backtracking] -> ShowS # | |
Show CompletionResult | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> CompletionResult -> ShowS # show :: CompletionResult -> String # showList :: [CompletionResult] -> ShowS # | |
Show IsCmdStart | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> IsCmdStart -> ShowS # show :: IsCmdStart -> String # showList :: [IsCmdStart] -> ShowS # | |
Show OptName | |
Show OptProperties | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> OptProperties -> ShowS # show :: OptProperties -> String # showList :: [OptProperties] -> ShowS # | |
Show OptVisibility | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> OptVisibility -> ShowS # show :: OptVisibility -> String # showList :: [OptVisibility] -> ShowS # | |
Show ParserPrefs | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> ParserPrefs -> ShowS # show :: ParserPrefs -> String # showList :: [ParserPrefs] -> ShowS # | |
Show OsChar | |
Show OsString | On windows, decodes as UCS-2. On unix prints the raw bytes without decoding. |
Show PosixChar | |
Show PosixString | Prints the raw bytes without decoding. |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> PosixString -> ShowS # show :: PosixString -> String # showList :: [PosixString] -> ShowS # | |
Show WindowsChar | |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> WindowsChar -> ShowS # show :: WindowsChar -> String # showList :: [WindowsChar] -> ShowS # | |
Show WindowsString | Decodes as UCS-2. |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> WindowsString -> ShowS # show :: WindowsString -> String # showList :: [WindowsString] -> ShowS # | |
Show WrappedExc | |
Show ConLiftInfo | |
Defined in Polysemy.Internal.TH.Common Methods showsPrec :: Int -> ConLiftInfo -> ShowS # show :: ConLiftInfo -> String # showList :: [ConLiftInfo] -> ShowS # | |
Show ConnectInfo | |
Defined in Database.PostgreSQL.Simple.Internal Methods showsPrec :: Int -> ConnectInfo -> ShowS # show :: ConnectInfo -> String # showList :: [ConnectInfo] -> ShowS # | |
Show FormatError | |
Defined in Database.PostgreSQL.Simple.Internal Methods showsPrec :: Int -> FormatError -> ShowS # show :: FormatError -> String # showList :: [FormatError] -> ShowS # | |
Show QueryError | |
Defined in Database.PostgreSQL.Simple.Internal Methods showsPrec :: Int -> QueryError -> ShowS # show :: QueryError -> String # showList :: [QueryError] -> ShowS # | |
Show SomePostgreSqlException | |
Defined in Database.PostgreSQL.Simple.Internal Methods showsPrec :: Int -> SomePostgreSqlException -> ShowS # show :: SomePostgreSqlException -> String # showList :: [SomePostgreSqlException] -> ShowS # | |
Show SqlError | |
Show AExpr | |
Show AExprReversableOp | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> AExprReversableOp -> ShowS # show :: AExprReversableOp -> String # showList :: [AExprReversableOp] -> ShowS # | |
Show AexprConst | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> AexprConst -> ShowS # show :: AexprConst -> String # showList :: [AexprConst] -> ShowS # | |
Show AliasClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> AliasClause -> ShowS # show :: AliasClause -> String # showList :: [AliasClause] -> ShowS # | |
Show AllOp | |
Show AnyName | |
Show AnyOperator | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> AnyOperator -> ShowS # show :: AnyOperator -> String # showList :: [AnyOperator] -> ShowS # | |
Show ArrayExpr | |
Show AscDesc | |
Show BExpr | |
Show BExprIsOp | |
Show Bit | |
Show CExpr | |
Show CallStmt | |
Show CaseExpr | |
Show Character | |
Show Columnref | |
Show CommonTableExpr | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> CommonTableExpr -> ShowS # show :: CommonTableExpr -> String # showList :: [CommonTableExpr] -> ShowS # | |
Show ConfExpr | |
Show ConstCharacter | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ConstCharacter -> ShowS # show :: ConstCharacter -> String # showList :: [ConstCharacter] -> ShowS # | |
Show ConstDatetime | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ConstDatetime -> ShowS # show :: ConstDatetime -> String # showList :: [ConstDatetime] -> ShowS # | |
Show ConstTypename | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ConstTypename -> ShowS # show :: ConstTypename -> String # showList :: [ConstTypename] -> ShowS # | |
Show DeleteStmt | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> DeleteStmt -> ShowS # show :: DeleteStmt -> String # showList :: [DeleteStmt] -> ShowS # | |
Show ExtractArg | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ExtractArg -> ShowS # show :: ExtractArg -> String # showList :: [ExtractArg] -> ShowS # | |
Show ExtractList | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ExtractList -> ShowS # show :: ExtractList -> String # showList :: [ExtractList] -> ShowS # | |
Show ForLockingClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ForLockingClause -> ShowS # show :: ForLockingClause -> String # showList :: [ForLockingClause] -> ShowS # | |
Show ForLockingItem | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ForLockingItem -> ShowS # show :: ForLockingItem -> String # showList :: [ForLockingItem] -> ShowS # | |
Show ForLockingStrength | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ForLockingStrength -> ShowS # show :: ForLockingStrength -> String # showList :: [ForLockingStrength] -> ShowS # | |
Show FrameBound | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FrameBound -> ShowS # show :: FrameBound -> String # showList :: [FrameBound] -> ShowS # | |
Show FrameClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FrameClause -> ShowS # show :: FrameClause -> String # showList :: [FrameClause] -> ShowS # | |
Show FrameClauseMode | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FrameClauseMode -> ShowS # show :: FrameClauseMode -> String # showList :: [FrameClauseMode] -> ShowS # | |
Show FrameExtent | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FrameExtent -> ShowS # show :: FrameExtent -> String # showList :: [FrameExtent] -> ShowS # | |
Show FuncAliasClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncAliasClause -> ShowS # show :: FuncAliasClause -> String # showList :: [FuncAliasClause] -> ShowS # | |
Show FuncApplication | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncApplication -> ShowS # show :: FuncApplication -> String # showList :: [FuncApplication] -> ShowS # | |
Show FuncApplicationParams | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncApplicationParams -> ShowS # show :: FuncApplicationParams -> String # showList :: [FuncApplicationParams] -> ShowS # | |
Show FuncArgExpr | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncArgExpr -> ShowS # show :: FuncArgExpr -> String # showList :: [FuncArgExpr] -> ShowS # | |
Show FuncConstArgs | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncConstArgs -> ShowS # show :: FuncConstArgs -> String # showList :: [FuncConstArgs] -> ShowS # | |
Show FuncExpr | |
Show FuncExprCommonSubexpr | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncExprCommonSubexpr -> ShowS # show :: FuncExprCommonSubexpr -> String # showList :: [FuncExprCommonSubexpr] -> ShowS # | |
Show FuncExprWindowless | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> FuncExprWindowless -> ShowS # show :: FuncExprWindowless -> String # showList :: [FuncExprWindowless] -> ShowS # | |
Show FuncName | |
Show FuncTable | |
Show GenericType | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> GenericType -> ShowS # show :: GenericType -> String # showList :: [GenericType] -> ShowS # | |
Show GroupByItem | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> GroupByItem -> ShowS # show :: GroupByItem -> String # showList :: [GroupByItem] -> ShowS # | |
Show Ident | |
Show ImplicitRow | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> ImplicitRow -> ShowS # show :: ImplicitRow -> String # showList :: [ImplicitRow] -> ShowS # | |
Show InExpr | |
Show IndexElem | |
Show IndexElemDef | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> IndexElemDef -> ShowS # show :: IndexElemDef -> String # showList :: [IndexElemDef] -> ShowS # | |
Show IndirectionEl | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> IndirectionEl -> ShowS # show :: IndirectionEl -> String # showList :: [IndirectionEl] -> ShowS # | |
Show InsertColumnItem | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> InsertColumnItem -> ShowS # show :: InsertColumnItem -> String # showList :: [InsertColumnItem] -> ShowS # | |
Show InsertRest | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> InsertRest -> ShowS # show :: InsertRest -> String # showList :: [InsertRest] -> ShowS # | |
Show InsertStmt | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> InsertStmt -> ShowS # show :: InsertStmt -> String # showList :: [InsertStmt] -> ShowS # | |
Show InsertTarget | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> InsertTarget -> ShowS # show :: InsertTarget -> String # showList :: [InsertTarget] -> ShowS # | |
Show Interval | |
Show JoinMeth | |
Show JoinQual | |
Show JoinType | |
Show JoinedTable | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> JoinedTable -> ShowS # show :: JoinedTable -> String # showList :: [JoinedTable] -> ShowS # | |
Show LimitClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> LimitClause -> ShowS # show :: LimitClause -> String # showList :: [LimitClause] -> ShowS # | |
Show MathOp | |
Show NullsOrder | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> NullsOrder -> ShowS # show :: NullsOrder -> String # showList :: [NullsOrder] -> ShowS # | |
Show Numeric | |
Show OffsetClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OffsetClause -> ShowS # show :: OffsetClause -> String # showList :: [OffsetClause] -> ShowS # | |
Show OnConflict | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OnConflict -> ShowS # show :: OnConflict -> String # showList :: [OnConflict] -> ShowS # | |
Show OnConflictDo | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OnConflictDo -> ShowS # show :: OnConflictDo -> String # showList :: [OnConflictDo] -> ShowS # | |
Show OptTempTableName | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OptTempTableName -> ShowS # show :: OptTempTableName -> String # showList :: [OptTempTableName] -> ShowS # | |
Show OverClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OverClause -> ShowS # show :: OverClause -> String # showList :: [OverClause] -> ShowS # | |
Show OverlayList | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OverlayList -> ShowS # show :: OverlayList -> String # showList :: [OverlayList] -> ShowS # | |
Show OverrideKind | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> OverrideKind -> ShowS # show :: OverrideKind -> String # showList :: [OverrideKind] -> ShowS # | |
Show PositionList | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> PositionList -> ShowS # show :: PositionList -> String # showList :: [PositionList] -> ShowS # | |
Show PreparableStmt | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> PreparableStmt -> ShowS # show :: PreparableStmt -> String # showList :: [PreparableStmt] -> ShowS # | |
Show QualAllOp | |
Show QualOp | |
Show QualifiedName | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> QualifiedName -> ShowS # show :: QualifiedName -> String # showList :: [QualifiedName] -> ShowS # | |
Show RelationExpr | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> RelationExpr -> ShowS # show :: RelationExpr -> String # showList :: [RelationExpr] -> ShowS # | |
Show RelationExprOptAlias | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> RelationExprOptAlias -> ShowS # show :: RelationExprOptAlias -> String # showList :: [RelationExprOptAlias] -> ShowS # | |
Show Row | |
Show RowsfromItem | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> RowsfromItem -> ShowS # show :: RowsfromItem -> String # showList :: [RowsfromItem] -> ShowS # | |
Show SelectBinOp | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectBinOp -> ShowS # show :: SelectBinOp -> String # showList :: [SelectBinOp] -> ShowS # | |
Show SelectFetchFirstValue | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectFetchFirstValue -> ShowS # show :: SelectFetchFirstValue -> String # showList :: [SelectFetchFirstValue] -> ShowS # | |
Show SelectLimit | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectLimit -> ShowS # show :: SelectLimit -> String # showList :: [SelectLimit] -> ShowS # | |
Show SelectLimitValue | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectLimitValue -> ShowS # show :: SelectLimitValue -> String # showList :: [SelectLimitValue] -> ShowS # | |
Show SelectNoParens | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectNoParens -> ShowS # show :: SelectNoParens -> String # showList :: [SelectNoParens] -> ShowS # | |
Show SelectWithParens | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SelectWithParens -> ShowS # show :: SelectWithParens -> String # showList :: [SelectWithParens] -> ShowS # | |
Show SetClause | |
Show SetTarget | |
Show SimpleSelect | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SimpleSelect -> ShowS # show :: SimpleSelect -> String # showList :: [SimpleSelect] -> ShowS # | |
Show SimpleTypename | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SimpleTypename -> ShowS # show :: SimpleTypename -> String # showList :: [SimpleTypename] -> ShowS # | |
Show SortBy | |
Show SubType | |
Show SubqueryOp | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SubqueryOp -> ShowS # show :: SubqueryOp -> String # showList :: [SubqueryOp] -> ShowS # | |
Show SubstrList | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SubstrList -> ShowS # show :: SubstrList -> String # showList :: [SubstrList] -> ShowS # | |
Show SubstrListFromFor | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SubstrListFromFor -> ShowS # show :: SubstrListFromFor -> String # showList :: [SubstrListFromFor] -> ShowS # | |
Show SymbolicExprBinOp | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> SymbolicExprBinOp -> ShowS # show :: SymbolicExprBinOp -> String # showList :: [SymbolicExprBinOp] -> ShowS # | |
Show TableFuncElement | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> TableFuncElement -> ShowS # show :: TableFuncElement -> String # showList :: [TableFuncElement] -> ShowS # | |
Show TableRef | |
Show TablesampleClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> TablesampleClause -> ShowS # show :: TablesampleClause -> String # showList :: [TablesampleClause] -> ShowS # | |
Show TargetEl | |
Show Targeting | |
Show TrimList | |
Show TrimModifier | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> TrimModifier -> ShowS # show :: TrimModifier -> String # showList :: [TrimModifier] -> ShowS # | |
Show Typename | |
Show TypenameArrayDimensions | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> TypenameArrayDimensions -> ShowS # show :: TypenameArrayDimensions -> String # showList :: [TypenameArrayDimensions] -> ShowS # | |
Show UpdateStmt | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> UpdateStmt -> ShowS # show :: UpdateStmt -> String # showList :: [UpdateStmt] -> ShowS # | |
Show VerbalExprBinOp | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> VerbalExprBinOp -> ShowS # show :: VerbalExprBinOp -> String # showList :: [VerbalExprBinOp] -> ShowS # | |
Show WhenClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WhenClause -> ShowS # show :: WhenClause -> String # showList :: [WhenClause] -> ShowS # | |
Show WhereOrCurrentClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WhereOrCurrentClause -> ShowS # show :: WhereOrCurrentClause -> String # showList :: [WhereOrCurrentClause] -> ShowS # | |
Show WindowDefinition | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WindowDefinition -> ShowS # show :: WindowDefinition -> String # showList :: [WindowDefinition] -> ShowS # | |
Show WindowExclusionClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WindowExclusionClause -> ShowS # show :: WindowExclusionClause -> String # showList :: [WindowExclusionClause] -> ShowS # | |
Show WindowSpecification | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WindowSpecification -> ShowS # show :: WindowSpecification -> String # showList :: [WindowSpecification] -> ShowS # | |
Show WithClause | |
Defined in PostgresqlSyntax.Ast Methods showsPrec :: Int -> WithClause -> ShowS # show :: WithClause -> String # showList :: [WithClause] -> ShowS # | |
Show Mode | |
Show Style | |
Show TextDetails | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Methods showsPrec :: Int -> TextDetails -> ShowS # show :: TextDetails -> String # showList :: [TextDetails] -> ShowS # | |
Show Doc | |
Show ColorOptions | |
Defined in Text.Pretty.Simple.Internal.Color Methods showsPrec :: Int -> ColorOptions -> ShowS # show :: ColorOptions -> String # showList :: [ColorOptions] -> ShowS # | |
Show Style | |
Show Expr | |
Show Annotation | |
Defined in Text.Pretty.Simple.Internal.Printer Methods showsPrec :: Int -> Annotation -> ShowS # show :: Annotation -> String # showList :: [Annotation] -> ShowS # | |
Show CheckColorTty | |
Defined in Text.Pretty.Simple.Internal.Printer Methods showsPrec :: Int -> CheckColorTty -> ShowS # show :: CheckColorTty -> String # showList :: [CheckColorTty] -> ShowS # | |
Show OutputOptions | |
Defined in Text.Pretty.Simple.Internal.Printer Methods showsPrec :: Int -> OutputOptions -> ShowS # show :: OutputOptions -> String # showList :: [OutputOptions] -> ShowS # | |
Show StringOutputStyle | |
Defined in Text.Pretty.Simple.Internal.Printer Methods showsPrec :: Int -> StringOutputStyle -> ShowS # show :: StringOutputStyle -> String # showList :: [StringOutputStyle] -> ShowS # | |
Show FusionDepth | |
Defined in Prettyprinter.Internal Methods showsPrec :: Int -> FusionDepth -> ShowS # show :: FusionDepth -> String # showList :: [FusionDepth] -> ShowS # | |
Show LayoutOptions | |
Defined in Prettyprinter.Internal Methods showsPrec :: Int -> LayoutOptions -> ShowS # show :: LayoutOptions -> String # showList :: [LayoutOptions] -> ShowS # | |
Show PageWidth | |
Show AnsiStyle | |
Show Bold | |
Show Color | |
Show Intensity | |
Show Italicized | |
Defined in Prettyprinter.Render.Terminal.Internal Methods showsPrec :: Int -> Italicized -> ShowS # show :: Italicized -> String # showList :: [Italicized] -> ShowS # | |
Show Layer | |
Show Underlined | |
Defined in Prettyprinter.Render.Terminal.Internal Methods showsPrec :: Int -> Underlined -> ShowS # show :: Underlined -> String # showList :: [Underlined] -> ShowS # | |
Show StdGen | |
Show CompOption | |
Defined in Text.Regex.Posix.Wrap Methods showsPrec :: Int -> CompOption -> ShowS # show :: CompOption -> String # showList :: [CompOption] -> ShowS # | |
Show ExecOption | |
Defined in Text.Regex.Posix.Wrap Methods showsPrec :: Int -> ExecOption -> ShowS # show :: ExecOption -> String # showList :: [ExecOption] -> ShowS # | |
Show ReturnCode | |
Defined in Text.Regex.Posix.Wrap Methods showsPrec :: Int -> ReturnCode -> ShowS # show :: ReturnCode -> String # showList :: [ReturnCode] -> ShowS # | |
Show Undefined | |
Show Bug | |
Show InvalidAccess | |
Defined in Control.Monad.Trans.Resource.Internal Methods showsPrec :: Int -> InvalidAccess -> ShowS # show :: InvalidAccess -> String # showList :: [InvalidAccess] -> ShowS # | |
Show ResourceCleanupException | |
Defined in Control.Monad.Trans.Resource.Internal Methods showsPrec :: Int -> ResourceCleanupException -> ShowS # show :: ResourceCleanupException -> String # showList :: [ResourceCleanupException] -> ShowS # | |
Show RetryAction | |
Defined in Control.Retry Methods showsPrec :: Int -> RetryAction -> ShowS # show :: RetryAction -> String # showList :: [RetryAction] -> ShowS # | |
Show RetryStatus | |
Defined in Control.Retry Methods showsPrec :: Int -> RetryStatus -> ShowS # show :: RetryStatus -> String # showList :: [RetryStatus] -> ShowS # | |
Show LogLevel | |
Show Scientific | See |
Defined in Data.Scientific Methods showsPrec :: Int -> Scientific -> ShowS # show :: Scientific -> String # showList :: [Scientific] -> ShowS # | |
Show ActionError | |
Defined in Web.Scotty.Internal.Types Methods showsPrec :: Int -> ActionError -> ShowS # show :: ActionError -> String # showList :: [ActionError] -> ShowS # | |
Show BodyPartiallyStreamed | |
Defined in Web.Scotty.Internal.Types Methods showsPrec :: Int -> BodyPartiallyStreamed -> ShowS # show :: BodyPartiallyStreamed -> String # showList :: [BodyPartiallyStreamed] -> ShowS # | |
Show ScottyException | |
Defined in Web.Scotty.Internal.Types Methods showsPrec :: Int -> ScottyException -> ShowS # show :: ScottyException -> String # showList :: [ScottyException] -> ShowS # | |
Show StatusError | |
Defined in Web.Scotty.Internal.Types Methods showsPrec :: Int -> StatusError -> ShowS # show :: StatusError -> String # showList :: [StatusError] -> ShowS # | |
Show AcceptHeader | |
Defined in Servant.API.ContentTypes Methods showsPrec :: Int -> AcceptHeader -> ShowS # show :: AcceptHeader -> String # showList :: [AcceptHeader] -> ShowS # | |
Show NoContent | |
Show IsSecure | |
Show Escaped | |
Show Link | |
Show LinkArrayElementStyle | |
Defined in Servant.Links Methods showsPrec :: Int -> LinkArrayElementStyle -> ShowS # show :: LinkArrayElementStyle -> String # showList :: [LinkArrayElementStyle] -> ShowS # | |
Show Param | |
Show AlterTableOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods showsPrec :: Int -> AlterTableOptions -> ShowS # show :: AlterTableOptions -> String # showList :: [AlterTableOptions] -> ShowS # | |
Show Dialect | |
Show KeywordMode | |
Defined in Language.SQL.SimpleSQL.Dialect Methods showsPrec :: Int -> KeywordMode -> ShowS # show :: KeywordMode -> String # showList :: [KeywordMode] -> ShowS # | |
Show SetOperatorOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods showsPrec :: Int -> SetOperatorOptions -> ShowS # show :: SetOperatorOptions -> String # showList :: [SetOperatorOptions] -> ShowS # | |
Show TrieKey | |
Show TrieNodeKey | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie Methods showsPrec :: Int -> TrieNodeKey -> ShowS # show :: TrieNodeKey -> String # showList :: [TrieNodeKey] -> ShowS # | |
Show CaseEquality | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> CaseEquality -> ShowS # show :: CaseEquality -> String # showList :: [CaseEquality] -> ShowS # | |
Show CodePointBase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> CodePointBase -> ShowS # show :: CodePointBase -> String # showList :: [CodePointBase] -> ShowS # | |
Show CodePointDigits | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> CodePointDigits -> ShowS # show :: CodePointDigits -> String # showList :: [CodePointDigits] -> ShowS # | |
Show EscMode | |
Show EscapeFallBack | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> EscapeFallBack -> ShowS # show :: EscapeFallBack -> String # showList :: [EscapeFallBack] -> ShowS # | |
Show EscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> EscapeParams -> ShowS # show :: EscapeParams -> String # showList :: [EscapeParams] -> ShowS # | |
Show InLowCase | |
Show InSource | |
Show KeyCharEventHandler | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> KeyCharEventHandler -> ShowS # show :: KeyCharEventHandler -> String # showList :: [KeyCharEventHandler] -> ShowS # | |
Show LetterCase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> LetterCase -> ShowS # show :: LetterCase -> String # showList :: [LetterCase] -> ShowS # | |
Show QuotationRuleIndex | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> QuotationRuleIndex -> ShowS # show :: QuotationRuleIndex -> String # showList :: [QuotationRuleIndex] -> ShowS # | |
Show QuotePrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> QuotePrefix -> ShowS # show :: QuotePrefix -> String # showList :: [QuotePrefix] -> ShowS # | |
Show QuotingChars | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> QuotingChars -> ShowS # show :: QuotingChars -> String # showList :: [QuotingChars] -> ShowS # | |
Show ScapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> ScapeParams -> ShowS # show :: ScapeParams -> String # showList :: [ScapeParams] -> ShowS # | |
Show ScapingRule | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> ScapingRule -> ShowS # show :: ScapingRule -> String # showList :: [ScapingRule] -> ShowS # | |
Show SrcLitStr | |
Show StrLitFmt | |
Show StrLitId | |
Show StrLitPrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> StrLitPrefix -> ShowS # show :: StrLitPrefix -> String # showList :: [StrLitPrefix] -> ShowS # | |
Show UnEscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods showsPrec :: Int -> UnEscapeParams -> ShowS # show :: UnEscapeParams -> String # showList :: [UnEscapeParams] -> ShowS # | |
Show SQLToken | |
Show SQLTokenStream | |
Defined in Language.SQL.SimpleSQL.Lex.LexType Methods showsPrec :: Int -> SQLTokenStream -> ShowS # show :: SQLTokenStream -> String # showList :: [SQLTokenStream] -> ShowS # | |
Show SrcPos | |
Show WithPos | |
Show AdminOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> AdminOption -> ShowS # show :: AdminOption -> String # showList :: [AdminOption] -> ShowS # | |
Show AdminOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> AdminOptionFor -> ShowS # show :: AdminOptionFor -> String # showList :: [AdminOptionFor] -> ShowS # | |
Show Alias | |
Show AlterDomainAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> AlterDomainAction -> ShowS # show :: AlterDomainAction -> String # showList :: [AlterDomainAction] -> ShowS # | |
Show AlterTableAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> AlterTableAction -> ShowS # show :: AlterTableAction -> String # showList :: [AlterTableAction] -> ShowS # | |
Show AnonymousStruct | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> AnonymousStruct -> ShowS # show :: AnonymousStruct -> String # showList :: [AnonymousStruct] -> ShowS # | |
Show AsStruct | |
Show BqStructExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> BqStructExpr -> ShowS # show :: BqStructExpr -> String # showList :: [BqStructExpr] -> ShowS # | |
Show CastSafe | |
Show CheckOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> CheckOption -> ShowS # show :: CheckOption -> String # showList :: [CheckOption] -> ShowS # | |
Show ColConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ColConstraint -> ShowS # show :: ColConstraint -> String # showList :: [ColConstraint] -> ShowS # | |
Show ColConstraintDef | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ColConstraintDef -> ShowS # show :: ColConstraintDef -> String # showList :: [ColConstraintDef] -> ShowS # | |
Show ColumnDef | |
Show Comment | |
Show CompPredQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> CompPredQuantifier -> ShowS # show :: CompPredQuantifier -> String # showList :: [CompPredQuantifier] -> ShowS # | |
Show Corresponding | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> Corresponding -> ShowS # show :: Corresponding -> String # showList :: [Corresponding] -> ShowS # | |
Show DefaultClause | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> DefaultClause -> ShowS # show :: DefaultClause -> String # showList :: [DefaultClause] -> ShowS # | |
Show Direction | |
Show DropBehaviour | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> DropBehaviour -> ShowS # show :: DropBehaviour -> String # showList :: [DropBehaviour] -> ShowS # | |
Show Frame | |
Show FramePos | |
Show FrameRows | |
Show GrantOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> GrantOption -> ShowS # show :: GrantOption -> String # showList :: [GrantOption] -> ShowS # | |
Show GrantOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> GrantOptionFor -> ShowS # show :: GrantOptionFor -> String # showList :: [GrantOptionFor] -> ShowS # | |
Show GroupingExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> GroupingExpr -> ShowS # show :: GroupingExpr -> String # showList :: [GroupingExpr] -> ShowS # | |
Show IdentityRestart | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> IdentityRestart -> ShowS # show :: IdentityRestart -> String # showList :: [IdentityRestart] -> ShowS # | |
Show IdentityWhen | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> IdentityWhen -> ShowS # show :: IdentityWhen -> String # showList :: [IdentityWhen] -> ShowS # | |
Show InPredValue | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> InPredValue -> ShowS # show :: InPredValue -> String # showList :: [InPredValue] -> ShowS # | |
Show InsertSource | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> InsertSource -> ShowS # show :: InsertSource -> String # showList :: [InsertSource] -> ShowS # | |
Show IntervalTypeField | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> IntervalTypeField -> ShowS # show :: IntervalTypeField -> String # showList :: [IntervalTypeField] -> ShowS # | |
Show JoinCondition | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> JoinCondition -> ShowS # show :: JoinCondition -> String # showList :: [JoinCondition] -> ShowS # | |
Show JoinType | |
Show Name | |
Show NullsOrder | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> NullsOrder -> ShowS # show :: NullsOrder -> String # showList :: [NullsOrder] -> ShowS # | |
Show NullsRespect | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> NullsRespect -> ShowS # show :: NullsRespect -> String # showList :: [NullsRespect] -> ShowS # | |
Show ParensOperator | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ParensOperator -> ShowS # show :: ParensOperator -> String # showList :: [ParensOperator] -> ShowS # | |
Show ParensOperatorArgument | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ParensOperatorArgument -> ShowS # show :: ParensOperatorArgument -> String # showList :: [ParensOperatorArgument] -> ShowS # | |
Show PrecMultiplier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> PrecMultiplier -> ShowS # show :: PrecMultiplier -> String # showList :: [PrecMultiplier] -> ShowS # | |
Show PrecUnits | |
Show PrivilegeAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> PrivilegeAction -> ShowS # show :: PrivilegeAction -> String # showList :: [PrivilegeAction] -> ShowS # | |
Show PrivilegeObject | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> PrivilegeObject -> ShowS # show :: PrivilegeObject -> String # showList :: [PrivilegeObject] -> ShowS # | |
Show QueryExpr | |
Show ReferenceMatch | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ReferenceMatch -> ShowS # show :: ReferenceMatch -> String # showList :: [ReferenceMatch] -> ShowS # | |
Show ReferentialAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ReferentialAction -> ShowS # show :: ReferentialAction -> String # showList :: [ReferentialAction] -> ShowS # | |
Show ScalarExpr | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> ScalarExpr -> ShowS # show :: ScalarExpr -> String # showList :: [ScalarExpr] -> ShowS # | |
Show SequenceGeneratorOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> SequenceGeneratorOption -> ShowS # show :: SequenceGeneratorOption -> String # showList :: [SequenceGeneratorOption] -> ShowS # | |
Show SetClause | |
Show SetOperatorName | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> SetOperatorName -> ShowS # show :: SetOperatorName -> String # showList :: [SetOperatorName] -> ShowS # | |
Show SetQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> SetQuantifier -> ShowS # show :: SetQuantifier -> String # showList :: [SetQuantifier] -> ShowS # | |
Show Sign | |
Show SortSpec | |
Show Statement | |
Show SubQueryExprType | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> SubQueryExprType -> ShowS # show :: SubQueryExprType -> String # showList :: [SubQueryExprType] -> ShowS # | |
Show TableConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> TableConstraint -> ShowS # show :: TableConstraint -> String # showList :: [TableConstraint] -> ShowS # | |
Show TableElement | |
Defined in Language.SQL.SimpleSQL.Syntax Methods showsPrec :: Int -> TableElement -> ShowS # show :: TableElement -> String # showList :: [TableElement] -> ShowS # | |
Show TableRef | |
Show TypeName | |
Show Key | |
Show MustacheException | |
Defined in Text.Mustache.Type Methods showsPrec :: Int -> MustacheException -> ShowS # show :: MustacheException -> String # showList :: [MustacheException] -> ShowS # | |
Show MustacheWarning | |
Defined in Text.Mustache.Type Methods showsPrec :: Int -> MustacheWarning -> ShowS # show :: MustacheWarning -> String # showList :: [MustacheWarning] -> ShowS # | |
Show Node | |
Show PName | |
Show Template | |
Show Leniency | |
Show AnnLookup | |
Show AnnTarget | |
Show Bang | |
Show BndrVis | |
Show Body | |
Show Bytes | |
Show Callconv | |
Show Clause | |
Show Con | |
Show Dec | |
Show DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DecidedStrictness -> ShowS # show :: DecidedStrictness -> String # showList :: [DecidedStrictness] -> ShowS # | |
Show DerivClause | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DerivClause -> ShowS # show :: DerivClause -> String # showList :: [DerivClause] -> ShowS # | |
Show DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DerivStrategy -> ShowS # show :: DerivStrategy -> String # showList :: [DerivStrategy] -> ShowS # | |
Show DocLoc | |
Show Exp | |
Show FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> FamilyResultSig -> ShowS # show :: FamilyResultSig -> String # showList :: [FamilyResultSig] -> ShowS # | |
Show Fixity | |
Show FixityDirection | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> FixityDirection -> ShowS # show :: FixityDirection -> String # showList :: [FixityDirection] -> ShowS # | |
Show Foreign | |
Show FunDep | |
Show Guard | |
Show Info | |
Show InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> InjectivityAnn -> ShowS # show :: InjectivityAnn -> String # showList :: [InjectivityAnn] -> ShowS # | |
Show Inline | |
Show Lit | |
Show Loc | |
Show Match | |
Show ModName | |
Show Module | |
Show ModuleInfo | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> ModuleInfo -> ShowS # show :: ModuleInfo -> String # showList :: [ModuleInfo] -> ShowS # | |
Show Name | |
Show NameFlavour | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> NameFlavour -> ShowS # show :: NameFlavour -> String # showList :: [NameFlavour] -> ShowS # | |
Show NameSpace | |
Show NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> NamespaceSpecifier -> ShowS # show :: NamespaceSpecifier -> String # showList :: [NamespaceSpecifier] -> ShowS # | |
Show OccName | |
Show Overlap | |
Show Pat | |
Show PatSynArgs | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> PatSynArgs -> ShowS # show :: PatSynArgs -> String # showList :: [PatSynArgs] -> ShowS # | |
Show PatSynDir | |
Show Phases | |
Show PkgName | |
Show Pragma | |
Show Range | |
Show Role | |
Show RuleBndr | |
Show RuleMatch | |
Show Safety | |
Show SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> SourceStrictness -> ShowS # show :: SourceStrictness -> String # showList :: [SourceStrictness] -> ShowS # | |
Show SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> SourceUnpackedness -> ShowS # show :: SourceUnpackedness -> String # showList :: [SourceUnpackedness] -> ShowS # | |
Show Specificity | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> Specificity -> ShowS # show :: Specificity -> String # showList :: [Specificity] -> ShowS # | |
Show Stmt | |
Show TyLit | |
Show TySynEqn | |
Show Type | |
Show TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> TypeFamilyHead -> ShowS # show :: TypeFamilyHead -> String # showList :: [TypeFamilyHead] -> ShowS # | |
Show Decoding | |
Show UnicodeException | |
Defined in Data.Text.Encoding.Error Methods showsPrec :: Int -> UnicodeException -> ShowS # show :: UnicodeException -> String # showList :: [UnicodeException] -> ShowS # | |
Show I8 | |
Show Builder | |
Show PartialUtf8CodePoint | |
Show Utf8State | |
Show DecoderState | |
Defined in Data.Text.Internal.Encoding.Utf8 Methods showsPrec :: Int -> DecoderState -> ShowS # show :: DecoderState -> String # showList :: [DecoderState] -> ShowS # | |
Show Size | |
Show FPFormat | |
Show Iter | |
Show ShortText | |
Show ConstructorInfo | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> ConstructorInfo -> ShowS # show :: ConstructorInfo -> String # showList :: [ConstructorInfo] -> ShowS # | |
Show ConstructorVariant | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> ConstructorVariant -> ShowS # show :: ConstructorVariant -> String # showList :: [ConstructorVariant] -> ShowS # | |
Show DatatypeInfo | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> DatatypeInfo -> ShowS # show :: DatatypeInfo -> String # showList :: [DatatypeInfo] -> ShowS # | |
Show DatatypeVariant | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> DatatypeVariant -> ShowS # show :: DatatypeVariant -> String # showList :: [DatatypeVariant] -> ShowS # | |
Show FieldStrictness | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> FieldStrictness -> ShowS # show :: FieldStrictness -> String # showList :: [FieldStrictness] -> ShowS # | |
Show Strictness | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> Strictness -> ShowS # show :: Strictness -> String # showList :: [Strictness] -> ShowS # | |
Show Unpackedness | |
Defined in Language.Haskell.TH.Datatype Methods showsPrec :: Int -> Unpackedness -> ShowS # show :: Unpackedness -> String # showList :: [Unpackedness] -> ShowS # | |
Show CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods showsPrec :: Int -> CalendarDiffDays -> ShowS # show :: CalendarDiffDays -> String # showList :: [CalendarDiffDays] -> ShowS # | |
Show Month | Show as |
Show Quarter | Show as |
Show QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods showsPrec :: Int -> QuarterOfYear -> ShowS # show :: QuarterOfYear -> String # showList :: [QuarterOfYear] -> ShowS # | |
Show DayOfWeek | |
Show DiffTime | |
Show NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods showsPrec :: Int -> NominalDiffTime -> ShowS # show :: NominalDiffTime -> String # showList :: [NominalDiffTime] -> ShowS # | |
Show SystemTime | |
Defined in Data.Time.Clock.Internal.SystemTime Methods showsPrec :: Int -> SystemTime -> ShowS # show :: SystemTime -> String # showList :: [SystemTime] -> ShowS # | |
Show TimeLocale | |
Defined in Data.Time.Format.Locale Methods showsPrec :: Int -> TimeLocale -> ShowS # show :: TimeLocale -> String # showList :: [TimeLocale] -> ShowS # | |
Show CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods showsPrec :: Int -> CalendarDiffTime -> ShowS # show :: CalendarDiffTime -> String # showList :: [CalendarDiffTime] -> ShowS # | |
Show LocalTime | |
Show TimeOfDay | |
Show TimeZone | This only shows the time zone name, or offset if the name is empty. |
Show ZonedTime | For the time zone, this only shows the name, or offset if the name is empty. |
Show UnixDiffTime | |
Defined in Data.UnixTime.Types Methods showsPrec :: Int -> UnixDiffTime -> ShowS # show :: UnixDiffTime -> String # showList :: [UnixDiffTime] -> ShowS # | |
Show UnixTime | |
Show ConcException | |
Defined in UnliftIO.Internals.Async Methods showsPrec :: Int -> ConcException -> ShowS # show :: ConcException -> String # showList :: [ConcException] -> ShowS # | |
Show Authority | |
Show Host | |
Show Port | |
Show Query | |
Show SchemaError | |
Defined in URI.ByteString.Types Methods showsPrec :: Int -> SchemaError -> ShowS # show :: SchemaError -> String # showList :: [SchemaError] -> ShowS # | |
Show Scheme | |
Show URINormalizationOptions | |
Defined in URI.ByteString.Types Methods showsPrec :: Int -> URINormalizationOptions -> ShowS # show :: URINormalizationOptions -> String # showList :: [URINormalizationOptions] -> ShowS # | |
Show URIParseError | |
Defined in URI.ByteString.Types Methods showsPrec :: Int -> URIParseError -> ShowS # show :: URIParseError -> String # showList :: [URIParseError] -> ShowS # | |
Show UserInfo | |
Show State | |
Show UUID | Pretty prints a
|
Show UnpackedUUID | |
Defined in Data.UUID.Types.Internal Methods showsPrec :: Int -> UnpackedUUID -> ShowS # show :: UnpackedUUID -> String # showList :: [UnpackedUUID] -> ShowS # | |
Show Content | |
Show Doctype | |
Show Document | |
Show Element | |
Show Event | |
Show ExternalID | |
Defined in Data.XML.Types Methods showsPrec :: Int -> ExternalID -> ShowS # show :: ExternalID -> String # showList :: [ExternalID] -> ShowS # | |
Show Instruction | |
Defined in Data.XML.Types Methods showsPrec :: Int -> Instruction -> ShowS # show :: Instruction -> String # showList :: [Instruction] -> ShowS # | |
Show Miscellaneous | |
Defined in Data.XML.Types Methods showsPrec :: Int -> Miscellaneous -> ShowS # show :: Miscellaneous -> String # showList :: [Miscellaneous] -> ShowS # | |
Show Name | |
Show Node | |
Show Prologue | |
Show CompressionLevel | |
Defined in Codec.Compression.Zlib.Stream Methods showsPrec :: Int -> CompressionLevel -> ShowS # show :: CompressionLevel -> String # showList :: [CompressionLevel] -> ShowS # | |
Show CompressionStrategy | |
Defined in Codec.Compression.Zlib.Stream Methods showsPrec :: Int -> CompressionStrategy -> ShowS # show :: CompressionStrategy -> String # showList :: [CompressionStrategy] -> ShowS # | |
Show DictionaryHash | |
Show Format | |
Show MemoryLevel | |
Defined in Codec.Compression.Zlib.Stream Methods showsPrec :: Int -> MemoryLevel -> ShowS # show :: MemoryLevel -> String # showList :: [MemoryLevel] -> ShowS # | |
Show Method | |
Show WindowBits | |
Defined in Codec.Compression.Zlib.Stream Methods showsPrec :: Int -> WindowBits -> ShowS # show :: WindowBits -> String # showList :: [WindowBits] -> ShowS # | |
Show Integer | @since base-2.01 |
Show Natural | @since base-4.8.0.0 |
Show () | @since base-2.01 |
Show Bool | @since base-2.01 |
Show Char | @since base-2.01 |
Show Int | @since base-2.01 |
Show Levity | @since base-4.15.0.0 |
Show RuntimeRep | @since base-4.11.0.0 |
Defined in GHC.Internal.Show Methods showsPrec :: Int -> RuntimeRep -> ShowS # show :: RuntimeRep -> String # showList :: [RuntimeRep] -> ShowS # | |
Show VecCount | @since base-4.11.0.0 |
Show VecElem | @since base-4.11.0.0 |
Show Word | @since base-2.01 |
Show a => Show (Only a) | |
Show (Encoding' a) | |
Show v => Show (KeyMap v) | |
Show a => Show (IResult a) | |
Show a => Show (Result a) | |
Show a => Show (WithJSONWarnings a) | |
Defined in Data.Aeson.WarningParser Methods showsPrec :: Int -> WithJSONWarnings a -> ShowS # show :: WithJSONWarnings a -> String # showList :: [WithJSONWarnings a] -> ShowS # | |
Show a => Show (Complex a) | Since: base-2.1 |
Show a => Show (First a) | Since: base-4.9.0.0 |
Show a => Show (Last a) | Since: base-4.9.0.0 |
Show a => Show (Max a) | Since: base-4.9.0.0 |
Show a => Show (Min a) | Since: base-4.9.0.0 |
Show m => Show (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods showsPrec :: Int -> WrappedMonoid m -> ShowS # show :: WrappedMonoid m -> String # showList :: [WrappedMonoid m] -> ShowS # | |
Show (Bits n) | |
(PrimType ty, Show ty) => Show (Block ty) | |
Show (Zn n) | |
Show (Zn64 n) | |
Show a => Show (NonEmpty a) | |
Show (CountOf ty) | |
Show (Offset ty) | |
(PrimType ty, Show ty) => Show (UArray ty) | |
Show a => Show (Flush a) | |
Show vertex => Show (SCC vertex) | Since: containers-0.5.9 |
Show a => Show (IntMap a) | |
Show a => Show (Seq a) | |
Show a => Show (ViewL a) | |
Show a => Show (ViewR a) | |
Show a => Show (Intersection a) | |
Defined in Data.Set.Internal Methods showsPrec :: Int -> Intersection a -> ShowS # show :: Intersection a -> String # showList :: [Intersection a] -> ShowS # | |
Show a => Show (Set a) | |
Show a => Show (Tree a) | |
Show a => Show (CryptoFailable a) | |
Defined in Crypto.Error.Types Methods showsPrec :: Int -> CryptoFailable a -> ShowS # show :: CryptoFailable a -> String # showList :: [CryptoFailable a] -> ShowS # | |
Show (Blake2b bitlen) | |
Show (Blake2bp bitlen) | |
Show (Blake2s bitlen) | |
Show (Blake2sp bitlen) | |
Show (SHAKE128 bitlen) | |
Show (SHAKE256 bitlen) | |
Show (Digest a) | |
Show a => Show (CryptoFailable a) | |
Defined in Crypto.Error.Types Methods showsPrec :: Int -> CryptoFailable a -> ShowS # show :: CryptoFailable a -> String # showList :: [CryptoFailable a] -> ShowS # | |
Show (Blake2b bitlen) | |
Show (Blake2bp bitlen) | |
Show (Blake2s bitlen) | |
Show (Blake2sp bitlen) | |
Show (SHAKE128 bitlen) | |
Show (SHAKE256 bitlen) | |
Show (Digest a) | |
Show1 f => Show (Fix f) | |
(Functor f, Show1 f) => Show (Mu f) | |
(Functor f, Show1 f) => Show (Nu f) | |
Show a => Show (DNonEmpty a) | |
Show a => Show (DList a) | |
Show a => Show (ExitCase a) | |
Show v => Show (LabelMap v) | |
Show a => Show (FromListCounting a) | |
Show a => Show (Word64Map a) | |
Show a => Show (OnOff a) | |
Show (MsgEnvelope DiagnosticMessage) | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> MsgEnvelope DiagnosticMessage -> ShowS # show :: MsgEnvelope DiagnosticMessage -> String # showList :: [MsgEnvelope DiagnosticMessage] -> ShowS # | |
Show a => Show (EpaLocation' a) | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> EpaLocation' a -> ShowS # show :: EpaLocation' a -> String # showList :: [EpaLocation' a] -> ShowS # | |
Show mod => Show (GenWithIsBoot mod) | |
Defined in GHC.Unit.Types Methods showsPrec :: Int -> GenWithIsBoot mod -> ShowS # show :: GenWithIsBoot mod -> String # showList :: [GenWithIsBoot mod] -> ShowS # | |
Show a => Show (SizedSeq a) | |
Show b => Show (GenClosure b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenClosure b -> ShowS # show :: GenClosure b -> String # showList :: [GenClosure b] -> ShowS # | |
Show b => Show (GenStackField b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStackField b -> ShowS # show :: GenStackField b -> String # showList :: [GenStackField b] -> ShowS # | |
Show b => Show (GenStackFrame b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStackFrame b -> ShowS # show :: GenStackFrame b -> String # showList :: [GenStackFrame b] -> ShowS # | |
Show b => Show (GenStgStackClosure b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStgStackClosure b -> ShowS # show :: GenStgStackClosure b -> String # showList :: [GenStgStackClosure b] -> ShowS # | |
Show a => Show (NonEmpty a) | @since base-4.11.0.0 |
Show a => Show (Identity a) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 |
Show a => Show (First a) | @since base-2.01 |
Show a => Show (Last a) | @since base-2.01 |
Show a => Show (Down a) | This instance would be equivalent to the derived instances of the
@since base-4.7.0.0 |
Show a => Show (Dual a) | @since base-2.01 |
Show a => Show (Product a) | @since base-2.01 |
Show a => Show (Sum a) | @since base-2.01 |
Show a => Show (ExceptionWithContext a) | |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> ExceptionWithContext a -> ShowS # show :: ExceptionWithContext a -> String # showList :: [ExceptionWithContext a] -> ShowS # | |
Show e => Show (NoBacktrace e) | |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> NoBacktrace e -> ShowS # show :: NoBacktrace e -> String # showList :: [NoBacktrace e] -> ShowS # | |
Show (ForeignPtr a) | @since base-2.01 |
Defined in GHC.Internal.ForeignPtr Methods showsPrec :: Int -> ForeignPtr a -> ShowS # show :: ForeignPtr a -> String # showList :: [ForeignPtr a] -> ShowS # | |
Show a => Show (ZipList a) | @since base-4.7.0.0 |
Show p => Show (Par1 p) | @since base-4.7.0.0 |
Show (FunPtr a) | @since base-2.01 |
Show (Ptr a) | @since base-2.01 |
Show a => Show (Ratio a) | @since base-2.0.1 |
Show (SNat n) | @since base-4.18.0.0 |
Show a => Show (EvalExpr a) | |
Show a => Show (EvalResult a) | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalResult a -> ShowS # show :: EvalResult a -> String # showList :: [EvalResult a] -> ShowS # | |
Show (Message a) | |
Show a => Show (QResult a) | |
Show (THMessage a) | |
Show a => Show (THResult a) | |
Show (RemotePtr a) | |
Show (RemoteRef a) | |
Show (OAuthCode s) | |
Show (OAuthToken s) | |
Defined in Gogol.Internal.Auth Methods showsPrec :: Int -> OAuthToken s -> ShowS # show :: OAuthToken s -> String # showList :: [OAuthToken s] -> ShowS # | |
Show a => Show (Hashed a) | |
Show a => Show (ListOf a) | |
Show l => Show (ModuleHeadAndImports l) | |
Defined in Language.Haskell.Exts.Parser Methods showsPrec :: Int -> ModuleHeadAndImports l -> ShowS # show :: ModuleHeadAndImports l -> String # showList :: [ModuleHeadAndImports l] -> ShowS # | |
Show a => Show (NonGreedy a) | |
Show l => Show (PragmasAndModuleHead l) | |
Defined in Language.Haskell.Exts.Parser Methods showsPrec :: Int -> PragmasAndModuleHead l -> ShowS # show :: PragmasAndModuleHead l -> String # showList :: [PragmasAndModuleHead l] -> ShowS # | |
Show l => Show (PragmasAndModuleName l) | |
Defined in Language.Haskell.Exts.Parser Methods showsPrec :: Int -> PragmasAndModuleName l -> ShowS # show :: PragmasAndModuleName l -> String # showList :: [PragmasAndModuleName l] -> ShowS # | |
Show a => Show (Loc a) | |
Show l => Show (Activation l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> Activation l -> ShowS # show :: Activation l -> String # showList :: [Activation l] -> ShowS # | |
Show l => Show (Alt l) | |
Show l => Show (Annotation l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> Annotation l -> ShowS # show :: Annotation l -> String # showList :: [Annotation l] -> ShowS # | |
Show l => Show (Assoc l) | |
Show l => Show (Asst l) | |
Show l => Show (BangType l) | |
Show l => Show (Binds l) | |
Show l => Show (BooleanFormula l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> BooleanFormula l -> ShowS # show :: BooleanFormula l -> String # showList :: [BooleanFormula l] -> ShowS # | |
Show l => Show (Bracket l) | |
Show l => Show (CName l) | |
Show l => Show (CallConv l) | |
Show l => Show (ClassDecl l) | |
Show l => Show (ConDecl l) | |
Show l => Show (Context l) | |
Show l => Show (DataOrNew l) | |
Show l => Show (Decl l) | |
Show l => Show (DeclHead l) | |
Show l => Show (DerivStrategy l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> DerivStrategy l -> ShowS # show :: DerivStrategy l -> String # showList :: [DerivStrategy l] -> ShowS # | |
Show l => Show (Deriving l) | |
Show l => Show (EWildcard l) | |
Show l => Show (Exp l) | |
Show l => Show (ExportSpec l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ExportSpec l -> ShowS # show :: ExportSpec l -> String # showList :: [ExportSpec l] -> ShowS # | |
Show l => Show (ExportSpecList l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ExportSpecList l -> ShowS # show :: ExportSpecList l -> String # showList :: [ExportSpecList l] -> ShowS # | |
Show l => Show (FieldDecl l) | |
Show l => Show (FieldUpdate l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> FieldUpdate l -> ShowS # show :: FieldUpdate l -> String # showList :: [FieldUpdate l] -> ShowS # | |
Show l => Show (FunDep l) | |
Show l => Show (GadtDecl l) | |
Show l => Show (GuardedRhs l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> GuardedRhs l -> ShowS # show :: GuardedRhs l -> String # showList :: [GuardedRhs l] -> ShowS # | |
Show l => Show (IPBind l) | |
Show l => Show (IPName l) | |
Show l => Show (ImportDecl l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ImportDecl l -> ShowS # show :: ImportDecl l -> String # showList :: [ImportDecl l] -> ShowS # | |
Show l => Show (ImportSpec l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ImportSpec l -> ShowS # show :: ImportSpec l -> String # showList :: [ImportSpec l] -> ShowS # | |
Show l => Show (ImportSpecList l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ImportSpecList l -> ShowS # show :: ImportSpecList l -> String # showList :: [ImportSpecList l] -> ShowS # | |
Show l => Show (InjectivityInfo l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> InjectivityInfo l -> ShowS # show :: InjectivityInfo l -> String # showList :: [InjectivityInfo l] -> ShowS # | |
Show l => Show (InstDecl l) | |
Show l => Show (InstHead l) | |
Show l => Show (InstRule l) | |
Show l => Show (Literal l) | |
Show l => Show (Match l) | |
Show l => Show (MaybePromotedName l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> MaybePromotedName l -> ShowS # show :: MaybePromotedName l -> String # showList :: [MaybePromotedName l] -> ShowS # | |
Show l => Show (Module l) | |
Show l => Show (ModuleHead l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ModuleHead l -> ShowS # show :: ModuleHead l -> String # showList :: [ModuleHead l] -> ShowS # | |
Show l => Show (ModuleName l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ModuleName l -> ShowS # show :: ModuleName l -> String # showList :: [ModuleName l] -> ShowS # | |
Show l => Show (ModulePragma l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> ModulePragma l -> ShowS # show :: ModulePragma l -> String # showList :: [ModulePragma l] -> ShowS # | |
Show l => Show (Name l) | |
Show l => Show (Namespace l) | |
Show l => Show (Op l) | |
Show l => Show (Overlap l) | |
Show l => Show (PXAttr l) | |
Show l => Show (Pat l) | |
Show l => Show (PatField l) | |
Show l => Show (PatternSynDirection l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> PatternSynDirection l -> ShowS # show :: PatternSynDirection l -> String # showList :: [PatternSynDirection l] -> ShowS # | |
Show l => Show (Promoted l) | |
Show l => Show (QName l) | |
Show l => Show (QOp l) | |
Show l => Show (QualConDecl l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> QualConDecl l -> ShowS # show :: QualConDecl l -> String # showList :: [QualConDecl l] -> ShowS # | |
Show l => Show (QualStmt l) | |
Show l => Show (RPat l) | |
Show l => Show (RPatOp l) | |
Show l => Show (ResultSig l) | |
Show l => Show (Rhs l) | |
Show l => Show (Role l) | |
Show l => Show (Rule l) | |
Show l => Show (RuleVar l) | |
Show l => Show (Safety l) | |
Show l => Show (Sign l) | |
Show l => Show (SpecialCon l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> SpecialCon l -> ShowS # show :: SpecialCon l -> String # showList :: [SpecialCon l] -> ShowS # | |
Show l => Show (Splice l) | |
Show l => Show (Stmt l) | |
Show l => Show (TyVarBind l) | |
Show l => Show (Type l) | |
Show l => Show (TypeEqn l) | |
Show l => Show (Unpackedness l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> Unpackedness l -> ShowS # show :: Unpackedness l -> String # showList :: [Unpackedness l] -> ShowS # | |
Show l => Show (WarningText l) | |
Defined in Language.Haskell.Exts.Syntax Methods showsPrec :: Int -> WarningText l -> ShowS # show :: WarningText l -> String # showList :: [WarningText l] -> ShowS # | |
Show l => Show (XAttr l) | |
Show l => Show (XName l) | |
Show body => Show (HistoriedResponse body) | |
Defined in Network.HTTP.Client Methods showsPrec :: Int -> HistoriedResponse body -> ShowS # show :: HistoriedResponse body -> String # showList :: [HistoriedResponse body] -> ShowS # | |
Show body => Show (Response body) | |
Show a => Show (AddrRange a) | |
Show a => Show (Item a) | |
Show a => Show (Deque a) | |
Show (FieldException a) | |
Show e => Show (ErrorFancy e) | |
Defined in Text.Megaparsec.Error Methods showsPrec :: Int -> ErrorFancy e -> ShowS # show :: ErrorFancy e -> String # showList :: [ErrorFancy e] -> ShowS # | |
Show t => Show (ErrorItem t) | |
Show s => Show (PosState s) | |
Show mono => Show (NonNull mono) | |
Show a => Show (WithinSet a) # | |
Show a => Show (ColumnPolicy a) # | |
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> ColumnPolicy a -> ShowS # show :: ColumnPolicy a -> String # showList :: [ColumnPolicy a] -> ShowS # | |
Show (BackendTableMeta b) => Show (CreateTableAs b) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods showsPrec :: Int -> CreateTableAs b -> ShowS # show :: CreateTableAs b -> String # showList :: [CreateTableAs b] -> ShowS # | |
Show a => Show (Named a) | |
Show a => Show (BoolOrOpts a) | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> BoolOrOpts a -> ShowS # show :: BoolOrOpts a -> String # showList :: [BoolOrOpts a] -> ShowS # | |
Show a => Show (ContinuousAggregatePolicy' a) | |
Defined in Napkin.Types.Postgres.Timescale Methods showsPrec :: Int -> ContinuousAggregatePolicy' a -> ShowS # show :: ContinuousAggregatePolicy' a -> String # showList :: [ContinuousAggregatePolicy' a] -> ShowS # | |
Show ref => Show (DefinedCTEs ref) | |
Show ref => Show (Dependencies ref) | |
Show a => Show (Alias a) | |
Show a => Show (Selected a) | |
Show a => Show (WithSpecTable a) | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WithSpecTable a -> ShowS # show :: WithSpecTable a -> String # showList :: [WithSpecTable a] -> ShowS # | |
Show ref => Show (DefinedCTEs ref) | |
Show ref => Show (Dependencies ref) | |
Show a => Show (Transformed a) | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> Transformed a -> ShowS # show :: Transformed a -> String # showList :: [Transformed a] -> ShowS # | |
Show (BackendMaterializedViewMeta b) => Show (YamlBackendMaterializedViewMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods showsPrec :: Int -> YamlBackendMaterializedViewMeta b -> ShowS # show :: YamlBackendMaterializedViewMeta b -> String # showList :: [YamlBackendMaterializedViewMeta b] -> ShowS # | |
Show (BackendTableMeta b) => Show (YamlBackendTableMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods showsPrec :: Int -> YamlBackendTableMeta b -> ShowS # show :: YamlBackendTableMeta b -> String # showList :: [YamlBackendTableMeta b] -> ShowS # | |
Show (BackendViewMeta b) => Show (YamlBackendViewMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods showsPrec :: Int -> YamlBackendViewMeta b -> ShowS # show :: YamlBackendViewMeta b -> String # showList :: [YamlBackendViewMeta b] -> ShowS # | |
Show a => Show (Step a) | |
Show a => Show (Chunk a) | |
Show a => Show (OptTree a) | |
Show (Option a) | |
Show h => Show (ParserFailure h) | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> ParserFailure h -> ShowS # show :: ParserFailure h -> String # showList :: [ParserFailure h] -> ShowS # | |
Show a => Show (ParserResult a) | |
Defined in Options.Applicative.Types Methods showsPrec :: Int -> ParserResult a -> ShowS # show :: ParserResult a -> String # showList :: [ParserResult a] -> ShowS # | |
Show a => Show (OSet a) | |
Show a => Show (AnnotDetails a) | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Methods showsPrec :: Int -> AnnotDetails a -> ShowS # show :: AnnotDetails a -> String # showList :: [AnnotDetails a] -> ShowS # | |
Show (Doc a) | |
Show a => Show (Span a) | |
Show a => Show (CommaSeparated a) | |
Defined in Text.Pretty.Simple.Internal.Expr Methods showsPrec :: Int -> CommaSeparated a -> ShowS # show :: CommaSeparated a -> String # showList :: [CommaSeparated a] -> ShowS # | |
Show a => Show (Stream a) | |
Show a => Show (Tape a) | |
Show (Doc ann) |
|
Show ann => Show (SimpleDocStream ann) | |
Defined in Prettyprinter.Internal Methods showsPrec :: Int -> SimpleDocStream ann -> ShowS # show :: SimpleDocStream ann -> String # showList :: [SimpleDocStream ann] -> ShowS # | |
Show a => Show (Array a) | |
(Show a, Prim a) => Show (PrimArray a) | Since: primitive-0.6.4.0 |
Show a => Show (SmallArray a) | |
Defined in Data.Primitive.SmallArray Methods showsPrec :: Int -> SmallArray a -> ShowS # show :: SmallArray a -> String # showList :: [SmallArray a] -> ShowS # | |
Show g => Show (StateGen g) | |
Show g => Show (AtomicGen g) | |
Show g => Show (IOGen g) | |
Show g => Show (STGen g) | |
Show g => Show (TGen g) | |
Show a => Show (Trie a) | |
Show a => Show (I a) | |
Show a => Show (Maybe a) | |
Show flag => Show (TyVarBndr flag) | |
Show a => Show (HashSet a) | |
Show (URIRef a) | |
Show a => Show (Vector a) | |
(Show a, Prim a) => Show (Vector a) | |
(Show a, Storable a) => Show (Vector a) | |
Show a => Show (Maybe a) | @since base-2.01 |
Show a => Show (Solo a) | @since base-4.15 |
Show a => Show [a] | @since base-2.01 |
(Show k, Show e) => Show (TkArray k e) | |
(Show k, Show e) => Show (TkRecord k e) | |
(Show k, Show e) => Show (Tokens k e) | |
(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) | |
(Show i, Show r) => Show (IResult i r) | |
HasResolution a => Show (Fixed a) | Since: base-2.1 |
(Show a, Show b) => Show (Arg a b) | Since: base-4.9.0.0 |
(Show k, Show a) => Show (Map k a) | |
(Show1 f, Show a) => Show (Cofree f a) | |
(Show1 f, Show a) => Show (Free f a) | |
(Show a, Show b) => Show (Gr a b) | |
(Show l, Show e) => Show (GenLocated l e) | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> GenLocated l e -> ShowS # show :: GenLocated l e -> String # showList :: [GenLocated l e] -> ShowS # | |
(Show a, Show b) => Show (Either a b) | @since base-3.0 |
Show (Proxy s) | @since base-4.7.0.0 |
Show (TypeRep a) | |
Show (U1 p) | @since base-4.9.0.0 |
Show (V1 p) | @since base-4.9.0.0 |
Show a => Show (EvalStatus_ a b) | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalStatus_ a b -> ShowS # show :: EvalStatus_ a b -> String # showList :: [EvalStatus_ a b] -> ShowS # | |
Show (f a) => Show (Yoneda f a) | |
(Show i, Show a) => Show (Level i a) | |
(Show (Token s), Show e) => Show (ParseError s e) | |
Defined in Text.Megaparsec.Error Methods showsPrec :: Int -> ParseError s e -> ShowS # show :: ParseError s e -> String # showList :: [ParseError s e] -> ShowS # | |
(Show s, Show (Token s), Show e) => Show (ParseErrorBundle s e) | |
Defined in Text.Megaparsec.Error Methods showsPrec :: Int -> ParseErrorBundle s e -> ShowS # show :: ParseErrorBundle s e -> String # showList :: [ParseErrorBundle s e] -> ShowS # | |
(Show (ParseError s e), Show s) => Show (State s e) | |
Show (Answer b a) | |
Show (Ref a) | |
Show (DumpItem b) | |
Show (Renderable b) | |
Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types Methods showsPrec :: Int -> Renderable b -> ShowS # show :: Renderable b -> String # showList :: [Renderable b] -> ShowS # | |
Show (DryRunResult b) | |
Defined in Napkin.Run.Effects.Types Methods showsPrec :: Int -> DryRunResult b -> ShowS # show :: DryRunResult b -> String # showList :: [DryRunResult b] -> ShowS # | |
Show (BackendQueryStats bk) => Show (QueryStats bk) | |
Defined in Napkin.Types.QueryStats Methods showsPrec :: Int -> QueryStats bk -> ShowS # show :: QueryStats bk -> String # showList :: [QueryStats bk] -> ShowS # | |
(Show k, Show v) => Show (OMap k v) | |
Show a => Show (WithStatus k a) | |
Defined in Servant.API.UVerb Methods showsPrec :: Int -> WithStatus k a -> ShowS # show :: WithStatus k a -> String # showList :: [WithStatus k a] -> ShowS # | |
(Show a, Show b) => Show (Either a b) | |
(Show a, Show b) => Show (These a b) | |
(Show a, Show b) => Show (Pair a b) | |
Show a => Show (B dst a) | |
(Show a, Show b) => Show (These a b) | |
(Show1 f, Show a) => Show (Lift f a) | |
(Show1 m, Show a) => Show (MaybeT m a) | |
(Show k, Show v) => Show (HashMap k v) | |
(Show a, Show b) => Show (a, b) | @since base-2.01 |
Show (p (Fix p a) a) => Show (Fix p a) | |
Show (p a a) => Show (Join p a) | |
(Show a, Show (f b)) => Show (CofreeF f a b) | |
Show (w (CofreeF f a (CofreeT f w a))) => Show (CofreeT f w a) | |
(Show a, Show (f b)) => Show (FreeF f a b) | |
(Show1 f, Show1 m, Show a) => Show (FreeT f m a) | |
Show a => Show (Const a b) | This instance would be equivalent to the derived instances of the
@since base-4.8.0.0 |
Show (f a) => Show (Ap f a) | @since base-4.12.0.0 |
Show (f a) => Show (Alt f a) | @since base-4.8.0.0 |
Show (a :~: b) | @since base-4.7.0.0 |
Show (OrderingI a b) | |
Show (f p) => Show (Rec1 f p) | @since base-4.7.0.0 |
Show (URec Char p) | @since base-4.9.0.0 |
Show (URec Double p) | @since base-4.9.0.0 |
Show (URec Float p) | |
Show (URec Int p) | @since base-4.9.0.0 |
Show (URec Word p) | @since base-4.9.0.0 |
Show (f (a, b)) => Show (AlongsideLeft f b a) | |
Defined in Control.Lens.Internal.Getter Methods showsPrec :: Int -> AlongsideLeft f b a -> ShowS # show :: AlongsideLeft f b a -> String # showList :: [AlongsideLeft f b a] -> ShowS # | |
Show (f (a, b)) => Show (AlongsideRight f a b) | |
Defined in Control.Lens.Internal.Getter Methods showsPrec :: Int -> AlongsideRight f a b -> ShowS # show :: AlongsideRight f a b -> String # showList :: [AlongsideRight f a b] -> ShowS # | |
Show (Assertion a b) | |
Show (External m a) | |
Show (SqlParse m a) | |
Show (SqlRender a b) | |
Show a => Show (K a b) | |
All (Compose Show f) xs => Show (NP f xs) | |
Show (NP (NP f) xss) => Show (POP f xss) | |
All (Compose Show f) xs => Show (NS f xs) | |
Show (NS (NP f) xss) => Show (SOP f xss) | |
Show b => Show (Tagged s b) | |
(Show (f a), Show (g a), Show a) => Show (These1 f g a) | |
(Show1 f, Show a) => Show (Backwards f a) | |
(Show e, Show1 m, Show a) => Show (ExceptT e m a) | |
(Show1 f, Show a) => Show (IdentityT f a) | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) | |
Show a => Show (Constant a b) | |
(Show1 f, Show a) => Show (Reverse f a) | |
(Show a, Show b, Show c) => Show (a, b, c) | @since base-2.01 |
(Show (f a), Show (g a)) => Show (Product f g a) | Since: base-4.18.0.0 |
(Show (f a), Show (g a)) => Show (Sum f g a) | Since: base-4.18.0.0 |
Show (a :~~: b) | @since base-4.10.0.0 |
(Show (f p), Show (g p)) => Show ((f :*: g) p) | @since base-4.7.0.0 |
(Show (f p), Show (g p)) => Show ((f :+: g) p) | @since base-4.7.0.0 |
Show c => Show (K1 i c p) | @since base-4.7.0.0 |
Show (Handling a s m) | |
(Show i, Show a) => Show (Magma i t b a) | |
(Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => Show (RecreateTable b a c) | |
Defined in Napkin.Run.Effects.Languages.Recreate Methods showsPrec :: Int -> RecreateTable b a c -> ShowS # show :: RecreateTable b a c -> String # showList :: [RecreateTable b a c] -> ShowS # | |
(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => Show (SqlWrite bk a b) | |
(Show a, Show b, Show c, Show d) => Show (a, b, c, d) | @since base-2.01 |
Show (f (g a)) => Show (Compose f g a) | Since: base-4.18.0.0 |
Show (f a) => Show (Clown f a b) | |
Show (p b a) => Show (Flip p a b) | |
Show (g b) => Show (Joker g a b) | |
Show (p a b) => Show (WrappedBifunctor p a b) | |
Defined in Data.Bifunctor.Wrapped Methods showsPrec :: Int -> WrappedBifunctor p a b -> ShowS # show :: WrappedBifunctor p a b -> String # showList :: [WrappedBifunctor p a b] -> ShowS # | |
Show (f (g p)) => Show ((f :.: g) p) | @since base-4.7.0.0 |
Show (f p) => Show (M1 i c f p) | @since base-4.7.0.0 |
Show (AnnotateRead bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateRead Methods showsPrec :: Int -> AnnotateRead bk a b -> ShowS # show :: AnnotateRead bk a b -> String # showList :: [AnnotateRead bk a b] -> ShowS # | |
Show (AnnotateWrite bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateWrite Methods showsPrec :: Int -> AnnotateWrite bk a b -> ShowS # show :: AnnotateWrite bk a b -> String # showList :: [AnnotateWrite bk a b] -> ShowS # | |
Show (SqlRead b m a) | |
(Show1 f, Show1 g, Show a) => Show ((f :.: g) a) | |
(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) | @since base-2.01 |
(Show (f a b), Show (g a b)) => Show (Product f g a b) | |
(Show (p a b), Show (q a b)) => Show (Sum p q a b) | |
(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) | @since base-2.01 |
Show (f (p a b)) => Show (Tannen f p a b) | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h) | @since base-2.01 |
Show (p (f a) (g b)) => Show (Biff p f g a b) | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | @since base-2.01 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | @since base-2.01 |
The Eq
class defines equality (==
) and inequality (/=
).
All the basic datatypes exported by the Prelude are instances of Eq
,
and Eq
may be derived for any datatype whose constituents are also
instances of Eq
.
The Haskell Report defines no laws for Eq
. However, instances are
encouraged to follow these properties:
Instances
Eq SomeKeyPair | |
Defined in OpenSSL.EVP.PKey | |
Eq SomePublicKey | |
Defined in OpenSSL.EVP.PKey Methods (==) :: SomePublicKey -> SomePublicKey -> Bool # (/=) :: SomePublicKey -> SomePublicKey -> Bool # | |
Eq Lit | |
Eq Number | |
Eq Key | |
Eq Arity | |
Eq FunArg | |
Eq StarKindStatus | |
Eq DotNetTime | |
Defined in Data.Aeson.Types.Internal | |
Eq JSONPathElement | |
Defined in Data.Aeson.Types.Internal Methods (==) :: JSONPathElement -> JSONPathElement -> Bool # (/=) :: JSONPathElement -> JSONPathElement -> Bool # | |
Eq SumEncoding | |
Defined in Data.Aeson.Types.Internal | |
Eq Value | |
Eq Operation | |
Eq Patch | |
Eq Key | |
Eq Pointer | |
Eq JSONWarning | |
Defined in Data.Aeson.WarningParser | |
Eq More | |
Eq Pos | |
Eq ByteArray | Since: base-4.17.0.0 |
Eq Timeout | |
Eq Encoding | |
Eq ASCII7_Invalid | |
Eq ISO_8859_1_Invalid | |
Eq UTF16_Invalid | |
Eq UTF32_Invalid | |
Eq FileSize | |
Eq String | |
Eq ByteString | |
Defined in Data.ByteString.Internal.Type | |
Eq ByteString | |
Defined in Data.ByteString.Lazy.Internal | |
Eq ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods (==) :: ShortByteString -> ShortByteString -> Bool # (/=) :: ShortByteString -> ShortByteString -> Bool # | |
Eq IntSet | |
Eq SharedSecret | |
Defined in Crypto.ECC | |
Eq CryptoError | |
Defined in Crypto.Error.Types | |
Eq CryptoError | |
Defined in Crypto.Error.Types | |
Eq SQLData | |
Eq SQLError | |
Eq SQLOpenFlag | |
Defined in Database.SQLite3 | |
Eq SQLVFS | |
Eq ArgCount | |
Eq CArgCount | |
Eq CColumnIndex | |
Defined in Database.SQLite3.Bindings.Types | |
Eq CColumnType | |
Defined in Database.SQLite3.Bindings.Types | |
Eq CError | |
Eq CNumBytes | |
Eq CParamIndex | |
Defined in Database.SQLite3.Bindings.Types | |
Eq ColumnIndex | |
Defined in Database.SQLite3.Bindings.Types | |
Eq ColumnType | |
Defined in Database.SQLite3.Bindings.Types | |
Eq Error | |
Eq ParamIndex | |
Defined in Database.SQLite3.Bindings.Types | |
Eq Format | |
Eq Label | |
Eq LabelSet | |
Eq ExtMode | |
Eq Operand | |
Eq ShiftMode | |
Eq Target | |
Eq AltCon | |
Eq UnfoldingCache | |
Defined in GHC.Core Methods (==) :: UnfoldingCache -> UnfoldingCache -> Bool # (/=) :: UnfoldingCache -> UnfoldingCache -> Bool # | |
Eq UnfoldingGuidance | |
Defined in GHC.Core Methods (==) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool # (/=) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool # | |
Eq CoAxiomRule | |
Defined in GHC.Core.Coercion.Axiom | |
Eq ConLike | |
Eq DataCon | |
Eq StrictnessMark | |
Defined in GHC.Core.DataCon Methods (==) :: StrictnessMark -> StrictnessMark -> Bool # (/=) :: StrictnessMark -> StrictnessMark -> Bool # | |
Eq CoSel | |
Eq FunSel | |
Eq TyLit | |
Eq FastString | |
Defined in GHC.Data.FastString | |
Eq LexicalFastString | |
Defined in GHC.Data.FastString Methods (==) :: LexicalFastString -> LexicalFastString -> Bool # (/=) :: LexicalFastString -> LexicalFastString -> Bool # | |
Eq NonDetFastString | |
Defined in GHC.Data.FastString Methods (==) :: NonDetFastString -> NonDetFastString -> Bool # (/=) :: NonDetFastString -> NonDetFastString -> Bool # | |
Eq Word64Set | |
Eq CompilerInfo | |
Defined in GHC.Driver.DynFlags | |
Eq DynLibLoader | |
Defined in GHC.Driver.DynFlags | |
Eq DynamicTooState | |
Defined in GHC.Driver.DynFlags Methods (==) :: DynamicTooState -> DynamicTooState -> Bool # (/=) :: DynamicTooState -> DynamicTooState -> Bool # | |
Eq GhcLink | |
Eq GhcMode | |
Eq IgnorePackageFlag | |
Defined in GHC.Driver.DynFlags Methods (==) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool # (/=) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool # | |
Eq LinkerInfo | |
Defined in GHC.Driver.DynFlags | |
Eq ModRenaming | |
Defined in GHC.Driver.DynFlags | |
Eq PackageArg | |
Defined in GHC.Driver.DynFlags | |
Eq PackageDBFlag | |
Defined in GHC.Driver.DynFlags Methods (==) :: PackageDBFlag -> PackageDBFlag -> Bool # (/=) :: PackageDBFlag -> PackageDBFlag -> Bool # | |
Eq PackageFlag | |
Defined in GHC.Driver.DynFlags | |
Eq PkgDbRef | |
Eq TrustFlag | |
Eq AnnsModule | |
Defined in GHC.Hs | |
Eq NamespaceSpecifier | |
Defined in GHC.Hs.Binds Methods (==) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (/=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # | |
Eq HsRuleAnn | |
Eq BotInfo | |
Eq PmAltCon | Syntactic equality. |
Eq PmEquality | |
Defined in GHC.HsToCore.Pmc.Solver.Types | |
Eq PmLit | Syntactic equality. |
Eq BuildingCabalPackage | |
Defined in GHC.Iface.Errors.Types Methods (==) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool # (/=) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool # | |
Eq Ident | |
Eq AOp | |
Eq JStgExpr | |
Eq JStgStat | |
Eq JVal | |
Eq Op | |
Eq UOp | |
Eq AOp | |
Eq JExpr | |
Eq JStat | |
Eq JVal | |
Eq Op | |
Eq UOp | |
Eq AddEpAnn | |
Eq AnnKeywordId | |
Defined in GHC.Parser.Annotation | |
Eq AnnList | |
Eq AnnListItem | |
Defined in GHC.Parser.Annotation | |
Eq AnnPragma | |
Eq BindTag | |
Eq DeclTag | |
Eq EpAnnComments | |
Defined in GHC.Parser.Annotation Methods (==) :: EpAnnComments -> EpAnnComments -> Bool # (/=) :: EpAnnComments -> EpAnnComments -> Bool # | |
Eq EpaComment | |
Defined in GHC.Parser.Annotation | |
Eq EpaCommentTok | |
Defined in GHC.Parser.Annotation Methods (==) :: EpaCommentTok -> EpaCommentTok -> Bool # (/=) :: EpaCommentTok -> EpaCommentTok -> Bool # | |
Eq HasE | |
Eq IsUnicodeSyntax | |
Defined in GHC.Parser.Annotation Methods (==) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # (/=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # | |
Eq NameAdornment | |
Defined in GHC.Parser.Annotation Methods (==) :: NameAdornment -> NameAdornment -> Bool # (/=) :: NameAdornment -> NameAdornment -> Bool # | |
Eq NameAnn | |
Eq NoEpAnns | |
Eq ParenType | |
Eq TokenLocation | |
Defined in GHC.Parser.Annotation Methods (==) :: TokenLocation -> TokenLocation -> Bool # (/=) :: TokenLocation -> TokenLocation -> Bool # | |
Eq TrailingAnn | |
Defined in GHC.Parser.Annotation | |
Eq LexErrKind | |
Defined in GHC.Parser.Errors.Types | |
Eq NumUnderscoreReason | |
Defined in GHC.Parser.Errors.Types Methods (==) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # (/=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # | |
Eq ParseContext | |
Defined in GHC.Parser.Errors.Types | |
Eq PatIncompleteDoBlock | |
Defined in GHC.Parser.Errors.Types Methods (==) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool # (/=) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool # | |
Eq NoExtFieldSilent | |
Defined in GHC.Stg.Syntax Methods (==) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # (/=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # | |
Eq BlockRef | |
Eq ExportedFun | |
Defined in GHC.StgToJS.Object | |
Eq JSOptions | |
Eq ObjectKind | |
Defined in GHC.StgToJS.Object | |
Eq AssociatedTyLastVarInKind | |
Defined in GHC.Tc.Errors.Types Methods (==) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool # (/=) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool # | |
Eq AssociatedTyNotParamOverLastTyVar | |
Defined in GHC.Tc.Errors.Types | |
Eq DeriveAnyClassEnabled | |
Defined in GHC.Tc.Errors.Types Methods (==) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool # (/=) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool # | |
Eq Exported | |
Eq HasAssociatedDataFamInsts | |
Defined in GHC.Tc.Errors.Types Methods (==) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool # (/=) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool # | |
Eq HasKinds | |
Eq HasWildcard | |
Defined in GHC.Tc.Errors.Types | |
Eq SuggestPartialTypeSignatures | |
Defined in GHC.Tc.Errors.Types Methods (==) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool # (/=) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool # | |
Eq SuggestUndecidableInstances | |
Defined in GHC.Tc.Errors.Types Methods (==) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool # (/=) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool # | |
Eq UnsupportedCallConvention | |
Defined in GHC.Tc.Errors.Types Methods (==) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool # (/=) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool # | |
Eq UsingGeneralizedNewtypeDeriving | |
Defined in GHC.Tc.Errors.Types | |
Eq Activation | |
Defined in GHC.Types.Basic | |
Eq Alignment | |
Eq CbvMark | |
Eq CompilerPhase | |
Defined in GHC.Types.Basic Methods (==) :: CompilerPhase -> CompilerPhase -> Bool # (/=) :: CompilerPhase -> CompilerPhase -> Bool # | |
Eq DoPmc | |
Eq FunctionOrData | |
Defined in GHC.Types.Basic Methods (==) :: FunctionOrData -> FunctionOrData -> Bool # (/=) :: FunctionOrData -> FunctionOrData -> Bool # | |
Eq GenReason | |
Eq InlinePragma | |
Defined in GHC.Types.Basic | |
Eq InlineSpec | |
Defined in GHC.Types.Basic | |
Eq InsideLam | |
Eq IntWithInf | |
Defined in GHC.Types.Basic | |
Eq InterestingCxt | |
Defined in GHC.Types.Basic Methods (==) :: InterestingCxt -> InterestingCxt -> Bool # (/=) :: InterestingCxt -> InterestingCxt -> Bool # | |
Eq LeftOrRight | |
Defined in GHC.Types.Basic | |
Eq Levity | |
Eq OccInfo | |
Eq OneShotInfo | |
Defined in GHC.Types.Basic | |
Eq Origin | |
Eq OverlapFlag | |
Defined in GHC.Types.Basic | |
Eq OverlapMode | |
Defined in GHC.Types.Basic | |
Eq PprPrec | |
Eq RecFlag | |
Eq RuleMatchInfo | |
Defined in GHC.Types.Basic Methods (==) :: RuleMatchInfo -> RuleMatchInfo -> Bool # (/=) :: RuleMatchInfo -> RuleMatchInfo -> Bool # | |
Eq TailCallInfo | |
Defined in GHC.Types.Basic | |
Eq TupleSort | |
Eq TypeOrConstraint | |
Defined in GHC.Types.Basic Methods (==) :: TypeOrConstraint -> TypeOrConstraint -> Bool # (/=) :: TypeOrConstraint -> TypeOrConstraint -> Bool # | |
Eq TypeOrData | |
Defined in GHC.Types.Basic | |
Eq TypeOrKind | |
Defined in GHC.Types.Basic | |
Eq UnboxedTupleOrSum | |
Defined in GHC.Types.Basic Methods (==) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool # (/=) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool # | |
Eq DiagnosticCode | |
Defined in GHC.Types.Error Methods (==) :: DiagnosticCode -> DiagnosticCode -> Bool # (/=) :: DiagnosticCode -> DiagnosticCode -> Bool # | |
Eq DiagnosticReason | |
Defined in GHC.Types.Error Methods (==) :: DiagnosticReason -> DiagnosticReason -> Bool # (/=) :: DiagnosticReason -> DiagnosticReason -> Bool # | |
Eq Severity | |
Eq DuplicateRecordFields | |
Defined in GHC.Types.FieldLabel Methods (==) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool # (/=) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool # | |
Eq FieldLabel | |
Defined in GHC.Types.FieldLabel | |
Eq FieldSelectors | |
Defined in GHC.Types.FieldLabel Methods (==) :: FieldSelectors -> FieldSelectors -> Bool # (/=) :: FieldSelectors -> FieldSelectors -> Bool # | |
Eq Name | |
Eq NameSpace | |
Eq OccName | |
Eq FieldsOrSelectors | |
Defined in GHC.Types.Name.Reader Methods (==) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool # (/=) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool # | |
Eq ImpDeclSpec | |
Defined in GHC.Types.Name.Reader | |
Eq ImpItemSpec | |
Defined in GHC.Types.Name.Reader | |
Eq ImportSpec | |
Defined in GHC.Types.Name.Reader | |
Eq Parent | |
Eq RdrName | |
Eq SaneDouble | |
Defined in GHC.Types.SaneDouble | |
Eq FractionalExponentBase | |
Defined in GHC.Types.SourceText Methods (==) :: FractionalExponentBase -> FractionalExponentBase -> Bool # (/=) :: FractionalExponentBase -> FractionalExponentBase -> Bool # | |
Eq FractionalLit | Be wary of using this instance to compare for equal *values* when exponents are large. The same value expressed in different syntactic form won't compare as equal when any of the exponents is >= 100. |
Defined in GHC.Types.SourceText Methods (==) :: FractionalLit -> FractionalLit -> Bool # (/=) :: FractionalLit -> FractionalLit -> Bool # | |
Eq IntegralLit | |
Defined in GHC.Types.SourceText | |
Eq SourceText | |
Defined in GHC.Types.SourceText | |
Eq StringLiteral | |
Defined in GHC.Types.SourceText Methods (==) :: StringLiteral -> StringLiteral -> Bool # (/=) :: StringLiteral -> StringLiteral -> Bool # | |
Eq BufPos | |
Eq BufSpan | |
Eq DeltaPos | |
Eq NoComments | |
Defined in GHC.Types.SrcLoc | |
Eq PsLoc | |
Eq PsSpan | |
Eq RealSrcLoc | |
Defined in GHC.Types.SrcLoc | |
Eq RealSrcSpan | |
Defined in GHC.Types.SrcLoc | |
Eq SrcLoc | |
Eq SrcSpan | |
Eq UnhelpfulSpanReason | |
Defined in GHC.Types.SrcLoc Methods (==) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool # (/=) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool # | |
Eq TickishPlacement | |
Defined in GHC.Types.Tickish Methods (==) :: TickishPlacement -> TickishPlacement -> Bool # (/=) :: TickishPlacement -> TickishPlacement -> Bool # | |
Eq TickishScoping | |
Defined in GHC.Types.Tickish Methods (==) :: TickishScoping -> TickishScoping -> Bool # (/=) :: TickishScoping -> TickishScoping -> Bool # | |
Eq ForAllTyFlag | |
Defined in GHC.Types.Var | |
Eq FunTyFlag | |
Eq Specificity | |
Defined in GHC.Types.Var | |
Eq Var | |
Eq PackageId | |
Eq PackageName | |
Defined in GHC.Unit.Info | |
Eq InWarningCategory | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: InWarningCategory -> InWarningCategory -> Bool # (/=) :: InWarningCategory -> InWarningCategory -> Bool # | |
Eq WarningCategory | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: WarningCategory -> WarningCategory -> Bool # (/=) :: WarningCategory -> WarningCategory -> Bool # | |
Eq UnitId | |
Eq BindingSite | |
Defined in GHC.Utils.Outputable | |
Eq JoinPointHood | |
Defined in GHC.Utils.Outputable Methods (==) :: JoinPointHood -> JoinPointHood -> Bool # (/=) :: JoinPointHood -> JoinPointHood -> Bool # | |
Eq Boxity | |
Eq FieldLabelString | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: FieldLabelString -> FieldLabelString -> Bool # (/=) :: FieldLabelString -> FieldLabelString -> Bool # | |
Eq Role | |
Eq SrcStrictness | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: SrcStrictness -> SrcStrictness -> Bool # (/=) :: SrcStrictness -> SrcStrictness -> Bool # | |
Eq SrcUnpackedness | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: SrcUnpackedness -> SrcUnpackedness -> Bool # (/=) :: SrcUnpackedness -> SrcUnpackedness -> Bool # | |
Eq NewOrData | |
Eq SpliceDecoration | |
Defined in Language.Haskell.Syntax.Decls Methods (==) :: SpliceDecoration -> SpliceDecoration -> Bool # (/=) :: SpliceDecoration -> SpliceDecoration -> Bool # | |
Eq HsDoFlavour | |
Defined in Language.Haskell.Syntax.Expr | |
Eq HsLamVariant | |
Defined in Language.Haskell.Syntax.Expr | |
Eq DataConCantHappen | |
Defined in Language.Haskell.Syntax.Extension Methods (==) :: DataConCantHappen -> DataConCantHappen -> Bool # (/=) :: DataConCantHappen -> DataConCantHappen -> Bool # | |
Eq NoExtField | |
Defined in Language.Haskell.Syntax.Extension | |
Eq OverLitVal | |
Defined in Language.Haskell.Syntax.Lit | |
Eq ModuleName | |
Defined in Language.Haskell.Syntax.Module.Name | |
Eq RecFieldsDotDot | |
Defined in Language.Haskell.Syntax.Pat Methods (==) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # (/=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # | |
Eq HsIPName | |
Eq PromotionFlag | |
Defined in Language.Haskell.Syntax.Type Methods (==) :: PromotionFlag -> PromotionFlag -> Bool # (/=) :: PromotionFlag -> PromotionFlag -> Bool # | |
Eq BigNat | |
Eq ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type Methods (==) :: ForeignSrcLang -> ForeignSrcLang -> Bool # (/=) :: ForeignSrcLang -> ForeignSrcLang -> Bool # | |
Eq Extension | |
Eq PrimType | |
Eq TsoFlags | |
Eq WhatNext | |
Eq WhyBlocked | |
Defined in GHC.Exts.Heap.Closures | |
Eq StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types | |
Eq CostCentre | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Eq CostCentreStack | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods (==) :: CostCentreStack -> CostCentreStack -> Bool # (/=) :: CostCentreStack -> CostCentreStack -> Bool # | |
Eq IndexTable | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Eq StgTSOProfInfo | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods (==) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool # (/=) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool # | |
Eq Void | @since base-4.8.0.0 |
Eq ByteOrder | @since base-4.11.0.0 |
Eq ClosureType | |
Defined in GHC.Internal.ClosureTypes | |
Eq BlockReason | @since base-4.3.0.0 |
Defined in GHC.Internal.Conc.Sync | |
Eq ThreadId | @since base-4.2.0.0 |
Eq ThreadStatus | @since base-4.3.0.0 |
Defined in GHC.Internal.Conc.Sync | |
Eq Constr | Equality of constructors @since base-4.0.0.0 |
Eq ConstrRep | @since base-4.0.0.0 |
Eq DataRep | @since base-4.0.0.0 |
Eq Fixity | @since base-4.0.0.0 |
Eq All | @since base-2.01 |
Eq Any | @since base-2.01 |
Eq SomeTypeRep | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Eq Version | @since base-2.01 |
Eq ArithException | @since base-3.0 |
Defined in GHC.Internal.Exception.Type Methods (==) :: ArithException -> ArithException -> Bool # (/=) :: ArithException -> ArithException -> Bool # | |
Eq SpecConstrAnnotation | @since base-4.3.0.0 |
Defined in GHC.Internal.Exts Methods (==) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool # (/=) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool # | |
Eq CBool | |
Eq CChar | |
Eq CClock | |
Eq CDouble | |
Eq CFloat | |
Eq CInt | |
Eq CIntMax | |
Eq CIntPtr | |
Eq CLLong | |
Eq CLong | |
Eq CPtrdiff | |
Eq CSChar | |
Eq CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types | |
Eq CShort | |
Eq CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types | |
Eq CSize | |
Eq CTime | |
Eq CUChar | |
Eq CUInt | |
Eq CUIntMax | |
Eq CUIntPtr | |
Eq CULLong | |
Eq CULong | |
Eq CUSeconds | |
Eq CUShort | |
Eq CWchar | |
Eq Associativity | @since base-4.6.0.0 |
Defined in GHC.Internal.Generics Methods (==) :: Associativity -> Associativity -> Bool # (/=) :: Associativity -> Associativity -> Bool # | |
Eq DecidedStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods (==) :: DecidedStrictness -> DecidedStrictness -> Bool # (/=) :: DecidedStrictness -> DecidedStrictness -> Bool # | |
Eq Fixity | @since base-4.6.0.0 |
Eq SourceStrictness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods (==) :: SourceStrictness -> SourceStrictness -> Bool # (/=) :: SourceStrictness -> SourceStrictness -> Bool # | |
Eq SourceUnpackedness | @since base-4.9.0.0 |
Defined in GHC.Internal.Generics Methods (==) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # | |
Eq MaskingState | @since base-4.3.0.0 |
Defined in GHC.Internal.IO | |
Eq ArrayException | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Exception Methods (==) :: ArrayException -> ArrayException -> Bool # (/=) :: ArrayException -> ArrayException -> Bool # | |
Eq AsyncException | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Exception Methods (==) :: AsyncException -> AsyncException -> Bool # (/=) :: AsyncException -> AsyncException -> Bool # | |
Eq ExitCode | |
Eq IOErrorType | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception | |
Eq IOException | @since base-4.1.0.0 |
Defined in GHC.Internal.IO.Exception | |
Eq BufferMode | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Handle.Types | |
Eq Handle | @since base-4.1.0.0 |
Eq Newline | @since base-4.2.0.0 |
Eq NewlineMode | @since base-4.2.0.0 |
Defined in GHC.Internal.IO.Handle.Types | |
Eq IOMode | @since base-4.2.0.0 |
Eq Int16 | @since base-2.01 |
Eq Int32 | @since base-2.01 |
Eq Int64 | @since base-2.01 |
Eq Int8 | @since base-2.01 |
Eq IoSubSystem | |
Defined in GHC.Internal.RTS.Flags | |
Eq SrcLoc | @since base-4.9.0.0 |
Eq CBlkCnt | |
Eq CBlkSize | |
Eq CCc | |
Eq CClockId | |
Eq CDev | |
Eq CFsBlkCnt | |
Eq CFsFilCnt | |
Eq CGid | |
Eq CId | |
Eq CIno | |
Eq CKey | |
Eq CMode | |
Eq CNfds | |
Eq CNlink | |
Eq COff | |
Eq CPid | |
Eq CRLim | |
Eq CSocklen | |
Eq CSpeed | |
Eq CSsize | |
Eq CTcflag | |
Eq CTimer | |
Eq CUid | |
Eq Fd | |
Eq SomeNat | @since base-4.7.0.0 |
Eq GeneralCategory | @since base-2.01 |
Defined in GHC.Internal.Unicode Methods (==) :: GeneralCategory -> GeneralCategory -> Bool # (/=) :: GeneralCategory -> GeneralCategory -> Bool # | |
Eq Word16 | @since base-2.01 |
Eq Word32 | @since base-2.01 |
Eq Word64 | @since base-2.01 |
Eq Word8 | @since base-2.01 |
Eq Module | |
Eq Ordering | |
Eq TrName | |
Eq TyCon | |
Eq AuthorizedUser | |
Defined in Gogol.Internal.Auth Methods (==) :: AuthorizedUser -> AuthorizedUser -> Bool # (/=) :: AuthorizedUser -> AuthorizedUser -> Bool # | |
Eq OAuthClient | |
Defined in Gogol.Internal.Auth | |
Eq ServiceAccount | |
Defined in Gogol.Internal.Auth Methods (==) :: ServiceAccount -> ServiceAccount -> Bool # (/=) :: ServiceAccount -> ServiceAccount -> Bool # | |
Eq BigQueryDatasetsDelete | |
Defined in Gogol.BigQuery.Datasets.Delete Methods (==) :: BigQueryDatasetsDelete -> BigQueryDatasetsDelete -> Bool # (/=) :: BigQueryDatasetsDelete -> BigQueryDatasetsDelete -> Bool # | |
Eq BigQueryDatasetsGet | |
Defined in Gogol.BigQuery.Datasets.Get Methods (==) :: BigQueryDatasetsGet -> BigQueryDatasetsGet -> Bool # (/=) :: BigQueryDatasetsGet -> BigQueryDatasetsGet -> Bool # | |
Eq BigQueryDatasetsInsert | |
Defined in Gogol.BigQuery.Datasets.Insert Methods (==) :: BigQueryDatasetsInsert -> BigQueryDatasetsInsert -> Bool # (/=) :: BigQueryDatasetsInsert -> BigQueryDatasetsInsert -> Bool # | |
Eq BigQueryDatasetsList | |
Defined in Gogol.BigQuery.Datasets.List Methods (==) :: BigQueryDatasetsList -> BigQueryDatasetsList -> Bool # (/=) :: BigQueryDatasetsList -> BigQueryDatasetsList -> Bool # | |
Eq BigQueryDatasetsPatch | |
Defined in Gogol.BigQuery.Datasets.Patch Methods (==) :: BigQueryDatasetsPatch -> BigQueryDatasetsPatch -> Bool # (/=) :: BigQueryDatasetsPatch -> BigQueryDatasetsPatch -> Bool # | |
Eq BigQueryDatasetsUpdate | |
Defined in Gogol.BigQuery.Datasets.Update Methods (==) :: BigQueryDatasetsUpdate -> BigQueryDatasetsUpdate -> Bool # (/=) :: BigQueryDatasetsUpdate -> BigQueryDatasetsUpdate -> Bool # | |
Eq AggregateClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq Argument | |
Eq ArimaCoefficients | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ArimaCoefficients -> ArimaCoefficients -> Bool # (/=) :: ArimaCoefficients -> ArimaCoefficients -> Bool # | |
Eq ArimaFittingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ArimaFittingMetrics -> ArimaFittingMetrics -> Bool # (/=) :: ArimaFittingMetrics -> ArimaFittingMetrics -> Bool # | |
Eq ArimaForecastingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ArimaForecastingMetrics -> ArimaForecastingMetrics -> Bool # (/=) :: ArimaForecastingMetrics -> ArimaForecastingMetrics -> Bool # | |
Eq ArimaModelInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ArimaModelInfo -> ArimaModelInfo -> Bool # (/=) :: ArimaModelInfo -> ArimaModelInfo -> Bool # | |
Eq ArimaOrder | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ArimaResult | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ArimaSingleModelForecastingMetrics | |
Eq AuditConfig | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq AuditLogConfig | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: AuditLogConfig -> AuditLogConfig -> Bool # (/=) :: AuditLogConfig -> AuditLogConfig -> Bool # | |
Eq AvroOptions | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq BiEngineReason | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BiEngineReason -> BiEngineReason -> Bool # (/=) :: BiEngineReason -> BiEngineReason -> Bool # | |
Eq BiEngineStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BiEngineStatistics -> BiEngineStatistics -> Bool # (/=) :: BiEngineStatistics -> BiEngineStatistics -> Bool # | |
Eq BigQueryModelTraining | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BigQueryModelTraining -> BigQueryModelTraining -> Bool # (/=) :: BigQueryModelTraining -> BigQueryModelTraining -> Bool # | |
Eq BigtableColumn | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BigtableColumn -> BigtableColumn -> Bool # (/=) :: BigtableColumn -> BigtableColumn -> Bool # | |
Eq BigtableColumnFamily | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BigtableColumnFamily -> BigtableColumnFamily -> Bool # (/=) :: BigtableColumnFamily -> BigtableColumnFamily -> Bool # | |
Eq BigtableOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BigtableOptions -> BigtableOptions -> Bool # (/=) :: BigtableOptions -> BigtableOptions -> Bool # | |
Eq BinaryClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BinaryClassificationMetrics -> BinaryClassificationMetrics -> Bool # (/=) :: BinaryClassificationMetrics -> BinaryClassificationMetrics -> Bool # | |
Eq BinaryConfusionMatrix | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BinaryConfusionMatrix -> BinaryConfusionMatrix -> Bool # (/=) :: BinaryConfusionMatrix -> BinaryConfusionMatrix -> Bool # | |
Eq Binding | |
Eq BqmlIterationResult | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BqmlIterationResult -> BqmlIterationResult -> Bool # (/=) :: BqmlIterationResult -> BqmlIterationResult -> Bool # | |
Eq BqmlTrainingRun | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: BqmlTrainingRun -> BqmlTrainingRun -> Bool # (/=) :: BqmlTrainingRun -> BqmlTrainingRun -> Bool # | |
Eq BqmlTrainingRun_TrainingOptions | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq CategoricalValue | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: CategoricalValue -> CategoricalValue -> Bool # (/=) :: CategoricalValue -> CategoricalValue -> Bool # | |
Eq CategoryCount | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: CategoryCount -> CategoryCount -> Bool # (/=) :: CategoryCount -> CategoryCount -> Bool # | |
Eq CloneDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: CloneDefinition -> CloneDefinition -> Bool # (/=) :: CloneDefinition -> CloneDefinition -> Bool # | |
Eq Cluster | |
Eq ClusterInfo | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq Clustering | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ClusteringMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ClusteringMetrics -> ClusteringMetrics -> Bool # (/=) :: ClusteringMetrics -> ClusteringMetrics -> Bool # | |
Eq ConfusionMatrix | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ConfusionMatrix -> ConfusionMatrix -> Bool # (/=) :: ConfusionMatrix -> ConfusionMatrix -> Bool # | |
Eq ConnectionProperty | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ConnectionProperty -> ConnectionProperty -> Bool # (/=) :: ConnectionProperty -> ConnectionProperty -> Bool # | |
Eq CsvOptions | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq DataMaskingStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DataMaskingStatistics -> DataMaskingStatistics -> Bool # (/=) :: DataMaskingStatistics -> DataMaskingStatistics -> Bool # | |
Eq DataSplitResult | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DataSplitResult -> DataSplitResult -> Bool # (/=) :: DataSplitResult -> DataSplitResult -> Bool # | |
Eq Dataset | |
Eq DatasetAccessEntry | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DatasetAccessEntry -> DatasetAccessEntry -> Bool # (/=) :: DatasetAccessEntry -> DatasetAccessEntry -> Bool # | |
Eq DatasetList | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq DatasetList_DatasetsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DatasetList_DatasetsItem -> DatasetList_DatasetsItem -> Bool # (/=) :: DatasetList_DatasetsItem -> DatasetList_DatasetsItem -> Bool # | |
Eq DatasetList_DatasetsItem_Labels | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq DatasetReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DatasetReference -> DatasetReference -> Bool # (/=) :: DatasetReference -> DatasetReference -> Bool # | |
Eq Dataset_AccessItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: Dataset_AccessItem -> Dataset_AccessItem -> Bool # (/=) :: Dataset_AccessItem -> Dataset_AccessItem -> Bool # | |
Eq Dataset_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: Dataset_Labels -> Dataset_Labels -> Bool # (/=) :: Dataset_Labels -> Dataset_Labels -> Bool # | |
Eq Dataset_TagsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: Dataset_TagsItem -> Dataset_TagsItem -> Bool # (/=) :: Dataset_TagsItem -> Dataset_TagsItem -> Bool # | |
Eq DestinationTableProperties | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DestinationTableProperties -> DestinationTableProperties -> Bool # (/=) :: DestinationTableProperties -> DestinationTableProperties -> Bool # | |
Eq DestinationTableProperties_Labels | |
Eq DimensionalityReductionMetrics | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq DmlStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DmlStatistics -> DmlStatistics -> Bool # (/=) :: DmlStatistics -> DmlStatistics -> Bool # | |
Eq DoubleCandidates | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DoubleCandidates -> DoubleCandidates -> Bool # (/=) :: DoubleCandidates -> DoubleCandidates -> Bool # | |
Eq DoubleHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: DoubleHparamSearchSpace -> DoubleHparamSearchSpace -> Bool # (/=) :: DoubleHparamSearchSpace -> DoubleHparamSearchSpace -> Bool # | |
Eq DoubleRange | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq EncryptionConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: EncryptionConfiguration -> EncryptionConfiguration -> Bool # (/=) :: EncryptionConfiguration -> EncryptionConfiguration -> Bool # | |
Eq Entry | |
Eq ErrorProto | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq EvaluationMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: EvaluationMetrics -> EvaluationMetrics -> Bool # (/=) :: EvaluationMetrics -> EvaluationMetrics -> Bool # | |
Eq ExplainQueryStage | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ExplainQueryStage -> ExplainQueryStage -> Bool # (/=) :: ExplainQueryStage -> ExplainQueryStage -> Bool # | |
Eq ExplainQueryStep | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ExplainQueryStep -> ExplainQueryStep -> Bool # (/=) :: ExplainQueryStep -> ExplainQueryStep -> Bool # | |
Eq Explanation | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq Expr | |
Eq ExternalDataConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ExternalDataConfiguration -> ExternalDataConfiguration -> Bool # (/=) :: ExternalDataConfiguration -> ExternalDataConfiguration -> Bool # | |
Eq FeatureValue | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq GetIamPolicyRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GetIamPolicyRequest -> GetIamPolicyRequest -> Bool # (/=) :: GetIamPolicyRequest -> GetIamPolicyRequest -> Bool # | |
Eq GetPolicyOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GetPolicyOptions -> GetPolicyOptions -> Bool # (/=) :: GetPolicyOptions -> GetPolicyOptions -> Bool # | |
Eq GetQueryResultsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GetQueryResultsResponse -> GetQueryResultsResponse -> Bool # (/=) :: GetQueryResultsResponse -> GetQueryResultsResponse -> Bool # | |
Eq GetServiceAccountResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GetServiceAccountResponse -> GetServiceAccountResponse -> Bool # (/=) :: GetServiceAccountResponse -> GetServiceAccountResponse -> Bool # | |
Eq GlobalExplanation | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GlobalExplanation -> GlobalExplanation -> Bool # (/=) :: GlobalExplanation -> GlobalExplanation -> Bool # | |
Eq GoogleSheetsOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: GoogleSheetsOptions -> GoogleSheetsOptions -> Bool # (/=) :: GoogleSheetsOptions -> GoogleSheetsOptions -> Bool # | |
Eq HivePartitioningOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: HivePartitioningOptions -> HivePartitioningOptions -> Bool # (/=) :: HivePartitioningOptions -> HivePartitioningOptions -> Bool # | |
Eq HparamSearchSpaces | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: HparamSearchSpaces -> HparamSearchSpaces -> Bool # (/=) :: HparamSearchSpaces -> HparamSearchSpaces -> Bool # | |
Eq HparamTuningTrial | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: HparamTuningTrial -> HparamTuningTrial -> Bool # (/=) :: HparamTuningTrial -> HparamTuningTrial -> Bool # | |
Eq IndexUnusedReason | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: IndexUnusedReason -> IndexUnusedReason -> Bool # (/=) :: IndexUnusedReason -> IndexUnusedReason -> Bool # | |
Eq IntArray | |
Eq IntArrayHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: IntArrayHparamSearchSpace -> IntArrayHparamSearchSpace -> Bool # (/=) :: IntArrayHparamSearchSpace -> IntArrayHparamSearchSpace -> Bool # | |
Eq IntCandidates | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: IntCandidates -> IntCandidates -> Bool # (/=) :: IntCandidates -> IntCandidates -> Bool # | |
Eq IntHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: IntHparamSearchSpace -> IntHparamSearchSpace -> Bool # (/=) :: IntHparamSearchSpace -> IntHparamSearchSpace -> Bool # | |
Eq IntRange | |
Eq IterationResult | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: IterationResult -> IterationResult -> Bool # (/=) :: IterationResult -> IterationResult -> Bool # | |
Eq Job | |
Eq JobCancelResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobCancelResponse -> JobCancelResponse -> Bool # (/=) :: JobCancelResponse -> JobCancelResponse -> Bool # | |
Eq JobConfiguration | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfiguration -> JobConfiguration -> Bool # (/=) :: JobConfiguration -> JobConfiguration -> Bool # | |
Eq JobConfigurationExtract | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfigurationExtract -> JobConfigurationExtract -> Bool # (/=) :: JobConfigurationExtract -> JobConfigurationExtract -> Bool # | |
Eq JobConfigurationLoad | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfigurationLoad -> JobConfigurationLoad -> Bool # (/=) :: JobConfigurationLoad -> JobConfigurationLoad -> Bool # | |
Eq JobConfigurationQuery | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfigurationQuery -> JobConfigurationQuery -> Bool # (/=) :: JobConfigurationQuery -> JobConfigurationQuery -> Bool # | |
Eq JobConfigurationQuery_TableDefinitions | |
Eq JobConfigurationTableCopy | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfigurationTableCopy -> JobConfigurationTableCopy -> Bool # (/=) :: JobConfigurationTableCopy -> JobConfigurationTableCopy -> Bool # | |
Eq JobConfiguration_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobConfiguration_Labels -> JobConfiguration_Labels -> Bool # (/=) :: JobConfiguration_Labels -> JobConfiguration_Labels -> Bool # | |
Eq JobList | |
Eq JobList_JobsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobList_JobsItem -> JobList_JobsItem -> Bool # (/=) :: JobList_JobsItem -> JobList_JobsItem -> Bool # | |
Eq JobReference | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq JobStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobStatistics -> JobStatistics -> Bool # (/=) :: JobStatistics -> JobStatistics -> Bool # | |
Eq JobStatistics2 | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobStatistics2 -> JobStatistics2 -> Bool # (/=) :: JobStatistics2 -> JobStatistics2 -> Bool # | |
Eq JobStatistics2_ReservationUsageItem | |
Eq JobStatistics3 | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobStatistics3 -> JobStatistics3 -> Bool # (/=) :: JobStatistics3 -> JobStatistics3 -> Bool # | |
Eq JobStatistics4 | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobStatistics4 -> JobStatistics4 -> Bool # (/=) :: JobStatistics4 -> JobStatistics4 -> Bool # | |
Eq JobStatistics5 | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: JobStatistics5 -> JobStatistics5 -> Bool # (/=) :: JobStatistics5 -> JobStatistics5 -> Bool # | |
Eq JobStatistics_ReservationUsageItem | |
Eq JobStatus | |
Eq JsonObject | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ListModelsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ListModelsResponse -> ListModelsResponse -> Bool # (/=) :: ListModelsResponse -> ListModelsResponse -> Bool # | |
Eq ListRoutinesResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ListRoutinesResponse -> ListRoutinesResponse -> Bool # (/=) :: ListRoutinesResponse -> ListRoutinesResponse -> Bool # | |
Eq ListRowAccessPoliciesResponse | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq LocationMetadata | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: LocationMetadata -> LocationMetadata -> Bool # (/=) :: LocationMetadata -> LocationMetadata -> Bool # | |
Eq MaterializedViewDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: MaterializedViewDefinition -> MaterializedViewDefinition -> Bool # (/=) :: MaterializedViewDefinition -> MaterializedViewDefinition -> Bool # | |
Eq MlStatistics | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq Model | |
Eq ModelDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ModelDefinition -> ModelDefinition -> Bool # (/=) :: ModelDefinition -> ModelDefinition -> Bool # | |
Eq ModelDefinition_ModelOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ModelDefinition_ModelOptions -> ModelDefinition_ModelOptions -> Bool # (/=) :: ModelDefinition_ModelOptions -> ModelDefinition_ModelOptions -> Bool # | |
Eq ModelReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ModelReference -> ModelReference -> Bool # (/=) :: ModelReference -> ModelReference -> Bool # | |
Eq Model_Labels | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq MultiClassClassificationMetrics | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ParquetOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ParquetOptions -> ParquetOptions -> Bool # (/=) :: ParquetOptions -> ParquetOptions -> Bool # | |
Eq Policy | |
Eq PrincipalComponentInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: PrincipalComponentInfo -> PrincipalComponentInfo -> Bool # (/=) :: PrincipalComponentInfo -> PrincipalComponentInfo -> Bool # | |
Eq ProjectList | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq ProjectList_ProjectsItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ProjectList_ProjectsItem -> ProjectList_ProjectsItem -> Bool # (/=) :: ProjectList_ProjectsItem -> ProjectList_ProjectsItem -> Bool # | |
Eq ProjectReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ProjectReference -> ProjectReference -> Bool # (/=) :: ProjectReference -> ProjectReference -> Bool # | |
Eq QueryParameter | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryParameter -> QueryParameter -> Bool # (/=) :: QueryParameter -> QueryParameter -> Bool # | |
Eq QueryParameterType | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryParameterType -> QueryParameterType -> Bool # (/=) :: QueryParameterType -> QueryParameterType -> Bool # | |
Eq QueryParameterType_StructTypesItem | |
Eq QueryParameterValue | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryParameterValue -> QueryParameterValue -> Bool # (/=) :: QueryParameterValue -> QueryParameterValue -> Bool # | |
Eq QueryParameterValue_StructValues | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq QueryRequest | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq QueryRequest_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryRequest_Labels -> QueryRequest_Labels -> Bool # (/=) :: QueryRequest_Labels -> QueryRequest_Labels -> Bool # | |
Eq QueryResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryResponse -> QueryResponse -> Bool # (/=) :: QueryResponse -> QueryResponse -> Bool # | |
Eq QueryTimelineSample | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: QueryTimelineSample -> QueryTimelineSample -> Bool # (/=) :: QueryTimelineSample -> QueryTimelineSample -> Bool # | |
Eq RangePartitioning | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RangePartitioning -> RangePartitioning -> Bool # (/=) :: RangePartitioning -> RangePartitioning -> Bool # | |
Eq RangePartitioning_Range | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RangePartitioning_Range -> RangePartitioning_Range -> Bool # (/=) :: RangePartitioning_Range -> RangePartitioning_Range -> Bool # | |
Eq RankingMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RankingMetrics -> RankingMetrics -> Bool # (/=) :: RankingMetrics -> RankingMetrics -> Bool # | |
Eq RegressionMetrics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RegressionMetrics -> RegressionMetrics -> Bool # (/=) :: RegressionMetrics -> RegressionMetrics -> Bool # | |
Eq RemoteFunctionOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RemoteFunctionOptions -> RemoteFunctionOptions -> Bool # (/=) :: RemoteFunctionOptions -> RemoteFunctionOptions -> Bool # | |
Eq RemoteFunctionOptions_UserDefinedContext | |
Eq Routine | |
Eq RoutineReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RoutineReference -> RoutineReference -> Bool # (/=) :: RoutineReference -> RoutineReference -> Bool # | |
Eq Row | |
Eq RowAccessPolicy | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RowAccessPolicy -> RowAccessPolicy -> Bool # (/=) :: RowAccessPolicy -> RowAccessPolicy -> Bool # | |
Eq RowAccessPolicyReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RowAccessPolicyReference -> RowAccessPolicyReference -> Bool # (/=) :: RowAccessPolicyReference -> RowAccessPolicyReference -> Bool # | |
Eq RowLevelSecurityStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: RowLevelSecurityStatistics -> RowLevelSecurityStatistics -> Bool # (/=) :: RowLevelSecurityStatistics -> RowLevelSecurityStatistics -> Bool # | |
Eq ScriptStackFrame | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ScriptStackFrame -> ScriptStackFrame -> Bool # (/=) :: ScriptStackFrame -> ScriptStackFrame -> Bool # | |
Eq ScriptStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ScriptStatistics -> ScriptStatistics -> Bool # (/=) :: ScriptStatistics -> ScriptStatistics -> Bool # | |
Eq SearchStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SearchStatistics -> SearchStatistics -> Bool # (/=) :: SearchStatistics -> SearchStatistics -> Bool # | |
Eq SessionInfo | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq SetIamPolicyRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SetIamPolicyRequest -> SetIamPolicyRequest -> Bool # (/=) :: SetIamPolicyRequest -> SetIamPolicyRequest -> Bool # | |
Eq SnapshotDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SnapshotDefinition -> SnapshotDefinition -> Bool # (/=) :: SnapshotDefinition -> SnapshotDefinition -> Bool # | |
Eq SparkLoggingInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SparkLoggingInfo -> SparkLoggingInfo -> Bool # (/=) :: SparkLoggingInfo -> SparkLoggingInfo -> Bool # | |
Eq SparkOptions | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq SparkOptions_Properties | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SparkOptions_Properties -> SparkOptions_Properties -> Bool # (/=) :: SparkOptions_Properties -> SparkOptions_Properties -> Bool # | |
Eq SparkStatistics | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SparkStatistics -> SparkStatistics -> Bool # (/=) :: SparkStatistics -> SparkStatistics -> Bool # | |
Eq SparkStatistics_Endpoints | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: SparkStatistics_Endpoints -> SparkStatistics_Endpoints -> Bool # (/=) :: SparkStatistics_Endpoints -> SparkStatistics_Endpoints -> Bool # | |
Eq StandardSqlDataType | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: StandardSqlDataType -> StandardSqlDataType -> Bool # (/=) :: StandardSqlDataType -> StandardSqlDataType -> Bool # | |
Eq StandardSqlField | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: StandardSqlField -> StandardSqlField -> Bool # (/=) :: StandardSqlField -> StandardSqlField -> Bool # | |
Eq StandardSqlStructType | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: StandardSqlStructType -> StandardSqlStructType -> Bool # (/=) :: StandardSqlStructType -> StandardSqlStructType -> Bool # | |
Eq StandardSqlTableType | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: StandardSqlTableType -> StandardSqlTableType -> Bool # (/=) :: StandardSqlTableType -> StandardSqlTableType -> Bool # | |
Eq Streamingbuffer | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: Streamingbuffer -> Streamingbuffer -> Bool # (/=) :: Streamingbuffer -> Streamingbuffer -> Bool # | |
Eq StringHparamSearchSpace | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: StringHparamSearchSpace -> StringHparamSearchSpace -> Bool # (/=) :: StringHparamSearchSpace -> StringHparamSearchSpace -> Bool # | |
Eq Table | |
Eq TableCell | |
Eq TableDataInsertAllRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableDataInsertAllRequest -> TableDataInsertAllRequest -> Bool # (/=) :: TableDataInsertAllRequest -> TableDataInsertAllRequest -> Bool # | |
Eq TableDataInsertAllRequest_RowsItem | |
Eq TableDataInsertAllResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableDataInsertAllResponse -> TableDataInsertAllResponse -> Bool # (/=) :: TableDataInsertAllResponse -> TableDataInsertAllResponse -> Bool # | |
Eq TableDataInsertAllResponse_InsertErrorsItem | |
Eq TableDataList | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableDataList -> TableDataList -> Bool # (/=) :: TableDataList -> TableDataList -> Bool # | |
Eq TableFieldSchema | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableFieldSchema -> TableFieldSchema -> Bool # (/=) :: TableFieldSchema -> TableFieldSchema -> Bool # | |
Eq TableFieldSchema_Categories | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableFieldSchema_Categories -> TableFieldSchema_Categories -> Bool # (/=) :: TableFieldSchema_Categories -> TableFieldSchema_Categories -> Bool # | |
Eq TableFieldSchema_PolicyTags | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableFieldSchema_PolicyTags -> TableFieldSchema_PolicyTags -> Bool # (/=) :: TableFieldSchema_PolicyTags -> TableFieldSchema_PolicyTags -> Bool # | |
Eq TableList | |
Eq TableList_TablesItem | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableList_TablesItem -> TableList_TablesItem -> Bool # (/=) :: TableList_TablesItem -> TableList_TablesItem -> Bool # | |
Eq TableList_TablesItem_Labels | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableList_TablesItem_Labels -> TableList_TablesItem_Labels -> Bool # (/=) :: TableList_TablesItem_Labels -> TableList_TablesItem_Labels -> Bool # | |
Eq TableList_TablesItem_View | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableList_TablesItem_View -> TableList_TablesItem_View -> Bool # (/=) :: TableList_TablesItem_View -> TableList_TablesItem_View -> Bool # | |
Eq TableReference | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TableReference -> TableReference -> Bool # (/=) :: TableReference -> TableReference -> Bool # | |
Eq TableRow | |
Eq TableSchema | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq Table_Labels | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq TestIamPermissionsRequest | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TestIamPermissionsRequest -> TestIamPermissionsRequest -> Bool # (/=) :: TestIamPermissionsRequest -> TestIamPermissionsRequest -> Bool # | |
Eq TestIamPermissionsResponse | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TestIamPermissionsResponse -> TestIamPermissionsResponse -> Bool # (/=) :: TestIamPermissionsResponse -> TestIamPermissionsResponse -> Bool # | |
Eq TimePartitioning | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TimePartitioning -> TimePartitioning -> Bool # (/=) :: TimePartitioning -> TimePartitioning -> Bool # | |
Eq TrainingOptions | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TrainingOptions -> TrainingOptions -> Bool # (/=) :: TrainingOptions -> TrainingOptions -> Bool # | |
Eq TrainingOptions_LabelClassWeights | |
Eq TrainingRun | |
Defined in Gogol.BigQuery.Internal.Product | |
Eq TransactionInfo | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: TransactionInfo -> TransactionInfo -> Bool # (/=) :: TransactionInfo -> TransactionInfo -> Bool # | |
Eq UserDefinedFunctionResource | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: UserDefinedFunctionResource -> UserDefinedFunctionResource -> Bool # (/=) :: UserDefinedFunctionResource -> UserDefinedFunctionResource -> Bool # | |
Eq ViewDefinition | |
Defined in Gogol.BigQuery.Internal.Product Methods (==) :: ViewDefinition -> ViewDefinition -> Bool # (/=) :: ViewDefinition -> ViewDefinition -> Bool # | |
Eq Argument_ArgumentKind | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Argument_ArgumentKind -> Argument_ArgumentKind -> Bool # (/=) :: Argument_ArgumentKind -> Argument_ArgumentKind -> Bool # | |
Eq Argument_Mode | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Argument_Mode -> Argument_Mode -> Bool # (/=) :: Argument_Mode -> Argument_Mode -> Bool # | |
Eq ArimaForecastingMetrics_SeasonalPeriodsItem | |
Eq ArimaModelInfo_SeasonalPeriodsItem | |
Eq ArimaResult_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq AuditLogConfig_LogType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: AuditLogConfig_LogType -> AuditLogConfig_LogType -> Bool # (/=) :: AuditLogConfig_LogType -> AuditLogConfig_LogType -> Bool # | |
Eq DatasetAccessEntry_TargetTypesItem | |
Eq HparamTuningTrial_Status | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: HparamTuningTrial_Status -> HparamTuningTrial_Status -> Bool # (/=) :: HparamTuningTrial_Status -> HparamTuningTrial_Status -> Bool # | |
Eq JobsListProjection | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: JobsListProjection -> JobsListProjection -> Bool # (/=) :: JobsListProjection -> JobsListProjection -> Bool # | |
Eq JobsListStateFilter | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: JobsListStateFilter -> JobsListStateFilter -> Bool # (/=) :: JobsListStateFilter -> JobsListStateFilter -> Bool # | |
Eq Model_ModelType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Model_ModelType -> Model_ModelType -> Bool # (/=) :: Model_ModelType -> Model_ModelType -> Bool # | |
Eq Routine_DeterminismLevel | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Routine_DeterminismLevel -> Routine_DeterminismLevel -> Bool # (/=) :: Routine_DeterminismLevel -> Routine_DeterminismLevel -> Bool # | |
Eq Routine_Language | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Routine_Language -> Routine_Language -> Bool # (/=) :: Routine_Language -> Routine_Language -> Bool # | |
Eq Routine_RoutineType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: Routine_RoutineType -> Routine_RoutineType -> Bool # (/=) :: Routine_RoutineType -> Routine_RoutineType -> Bool # | |
Eq StandardSqlDataType_TypeKind | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: StandardSqlDataType_TypeKind -> StandardSqlDataType_TypeKind -> Bool # (/=) :: StandardSqlDataType_TypeKind -> StandardSqlDataType_TypeKind -> Bool # | |
Eq TablesGetView | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TablesGetView -> TablesGetView -> Bool # (/=) :: TablesGetView -> TablesGetView -> Bool # | |
Eq TrainingOptions_BoosterType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_BoosterType -> TrainingOptions_BoosterType -> Bool # (/=) :: TrainingOptions_BoosterType -> TrainingOptions_BoosterType -> Bool # | |
Eq TrainingOptions_ColorSpace | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_ColorSpace -> TrainingOptions_ColorSpace -> Bool # (/=) :: TrainingOptions_ColorSpace -> TrainingOptions_ColorSpace -> Bool # | |
Eq TrainingOptions_DartNormalizeType | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq TrainingOptions_DataFrequency | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq TrainingOptions_DataSplitMethod | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq TrainingOptions_DistanceType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_DistanceType -> TrainingOptions_DistanceType -> Bool # (/=) :: TrainingOptions_DistanceType -> TrainingOptions_DistanceType -> Bool # | |
Eq TrainingOptions_FeedbackType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_FeedbackType -> TrainingOptions_FeedbackType -> Bool # (/=) :: TrainingOptions_FeedbackType -> TrainingOptions_FeedbackType -> Bool # | |
Eq TrainingOptions_HolidayRegion | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq TrainingOptions_HparamTuningObjectivesItem | |
Eq TrainingOptions_KmeansInitializationMethod | |
Eq TrainingOptions_LearnRateStrategy | |
Defined in Gogol.BigQuery.Internal.Sum | |
Eq TrainingOptions_LossType | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_LossType -> TrainingOptions_LossType -> Bool # (/=) :: TrainingOptions_LossType -> TrainingOptions_LossType -> Bool # | |
Eq TrainingOptions_OptimizationStrategy | |
Eq TrainingOptions_TreeMethod | |
Defined in Gogol.BigQuery.Internal.Sum Methods (==) :: TrainingOptions_TreeMethod -> TrainingOptions_TreeMethod -> Bool # (/=) :: TrainingOptions_TreeMethod -> TrainingOptions_TreeMethod -> Bool # | |
Eq BigQueryJobsCancel | |
Defined in Gogol.BigQuery.Jobs.Cancel Methods (==) :: BigQueryJobsCancel -> BigQueryJobsCancel -> Bool # (/=) :: BigQueryJobsCancel -> BigQueryJobsCancel -> Bool # | |
Eq BigQueryJobsDelete | |
Defined in Gogol.BigQuery.Jobs.Delete Methods (==) :: BigQueryJobsDelete -> BigQueryJobsDelete -> Bool # (/=) :: BigQueryJobsDelete -> BigQueryJobsDelete -> Bool # | |
Eq BigQueryJobsGet | |
Defined in Gogol.BigQuery.Jobs.Get Methods (==) :: BigQueryJobsGet -> BigQueryJobsGet -> Bool # (/=) :: BigQueryJobsGet -> BigQueryJobsGet -> Bool # | |
Eq BigQueryJobsGetQueryResults | |
Defined in Gogol.BigQuery.Jobs.GetQueryResults Methods (==) :: BigQueryJobsGetQueryResults -> BigQueryJobsGetQueryResults -> Bool # (/=) :: BigQueryJobsGetQueryResults -> BigQueryJobsGetQueryResults -> Bool # | |
Eq BigQueryJobsInsert | |
Defined in Gogol.BigQuery.Jobs.Insert Methods (==) :: BigQueryJobsInsert -> BigQueryJobsInsert -> Bool # (/=) :: BigQueryJobsInsert -> BigQueryJobsInsert -> Bool # | |
Eq BigQueryJobsList | |
Defined in Gogol.BigQuery.Jobs.List Methods (==) :: BigQueryJobsList -> BigQueryJobsList -> Bool # (/=) :: BigQueryJobsList -> BigQueryJobsList -> Bool # | |
Eq BigQueryJobsQuery | |
Defined in Gogol.BigQuery.Jobs.Query Methods (==) :: BigQueryJobsQuery -> BigQueryJobsQuery -> Bool # (/=) :: BigQueryJobsQuery -> BigQueryJobsQuery -> Bool # | |
Eq BigQueryModelsDelete | |
Defined in Gogol.BigQuery.Models.Delete Methods (==) :: BigQueryModelsDelete -> BigQueryModelsDelete -> Bool # (/=) :: BigQueryModelsDelete -> BigQueryModelsDelete -> Bool # | |
Eq BigQueryModelsGet | |
Defined in Gogol.BigQuery.Models.Get Methods (==) :: BigQueryModelsGet -> BigQueryModelsGet -> Bool # (/=) :: BigQueryModelsGet -> BigQueryModelsGet -> Bool # | |
Eq BigQueryModelsList | |
Defined in Gogol.BigQuery.Models.List Methods (==) :: BigQueryModelsList -> BigQueryModelsList -> Bool # (/=) :: BigQueryModelsList -> BigQueryModelsList -> Bool # | |
Eq BigQueryModelsPatch | |
Defined in Gogol.BigQuery.Models.Patch Methods (==) :: BigQueryModelsPatch -> BigQueryModelsPatch -> Bool # (/=) :: BigQueryModelsPatch -> BigQueryModelsPatch -> Bool # | |
Eq BigQueryProjectsGetServiceAccount | |
Eq BigQueryProjectsList | |
Defined in Gogol.BigQuery.Projects.List Methods (==) :: BigQueryProjectsList -> BigQueryProjectsList -> Bool # (/=) :: BigQueryProjectsList -> BigQueryProjectsList -> Bool # | |
Eq BigQueryRoutinesDelete | |
Defined in Gogol.BigQuery.Routines.Delete Methods (==) :: BigQueryRoutinesDelete -> BigQueryRoutinesDelete -> Bool # (/=) :: BigQueryRoutinesDelete -> BigQueryRoutinesDelete -> Bool # | |
Eq BigQueryRoutinesGet | |
Defined in Gogol.BigQuery.Routines.Get Methods (==) :: BigQueryRoutinesGet -> BigQueryRoutinesGet -> Bool # (/=) :: BigQueryRoutinesGet -> BigQueryRoutinesGet -> Bool # | |
Eq BigQueryRoutinesInsert | |
Defined in Gogol.BigQuery.Routines.Insert Methods (==) :: BigQueryRoutinesInsert -> BigQueryRoutinesInsert -> Bool # (/=) :: BigQueryRoutinesInsert -> BigQueryRoutinesInsert -> Bool # | |
Eq BigQueryRoutinesList | |
Defined in Gogol.BigQuery.Routines.List Methods (==) :: BigQueryRoutinesList -> BigQueryRoutinesList -> Bool # (/=) :: BigQueryRoutinesList -> BigQueryRoutinesList -> Bool # | |
Eq BigQueryRoutinesUpdate | |
Defined in Gogol.BigQuery.Routines.Update Methods (==) :: BigQueryRoutinesUpdate -> BigQueryRoutinesUpdate -> Bool # (/=) :: BigQueryRoutinesUpdate -> BigQueryRoutinesUpdate -> Bool # | |
Eq BigQueryRowAccessPoliciesGetIamPolicy | |
Eq BigQueryRowAccessPoliciesList | |
Defined in Gogol.BigQuery.RowAccessPolicies.List | |
Eq BigQueryRowAccessPoliciesSetIamPolicy | |
Eq BigQueryRowAccessPoliciesTestIamPermissions | |
Eq BigQueryTabledataInsertAll | |
Defined in Gogol.BigQuery.Tabledata.InsertAll Methods (==) :: BigQueryTabledataInsertAll -> BigQueryTabledataInsertAll -> Bool # (/=) :: BigQueryTabledataInsertAll -> BigQueryTabledataInsertAll -> Bool # | |
Eq BigQueryTabledataList | |
Defined in Gogol.BigQuery.Tabledata.List Methods (==) :: BigQueryTabledataList -> BigQueryTabledataList -> Bool # (/=) :: BigQueryTabledataList -> BigQueryTabledataList -> Bool # | |
Eq BigQueryTablesDelete | |
Defined in Gogol.BigQuery.Tables.Delete Methods (==) :: BigQueryTablesDelete -> BigQueryTablesDelete -> Bool # (/=) :: BigQueryTablesDelete -> BigQueryTablesDelete -> Bool # | |
Eq BigQueryTablesGet | |
Defined in Gogol.BigQuery.Tables.Get Methods (==) :: BigQueryTablesGet -> BigQueryTablesGet -> Bool # (/=) :: BigQueryTablesGet -> BigQueryTablesGet -> Bool # | |
Eq BigQueryTablesGetIamPolicy | |
Defined in Gogol.BigQuery.Tables.GetIamPolicy Methods (==) :: BigQueryTablesGetIamPolicy -> BigQueryTablesGetIamPolicy -> Bool # (/=) :: BigQueryTablesGetIamPolicy -> BigQueryTablesGetIamPolicy -> Bool # | |
Eq BigQueryTablesInsert | |
Defined in Gogol.BigQuery.Tables.Insert Methods (==) :: BigQueryTablesInsert -> BigQueryTablesInsert -> Bool # (/=) :: BigQueryTablesInsert -> BigQueryTablesInsert -> Bool # | |
Eq BigQueryTablesList | |
Defined in Gogol.BigQuery.Tables.List Methods (==) :: BigQueryTablesList -> BigQueryTablesList -> Bool # (/=) :: BigQueryTablesList -> BigQueryTablesList -> Bool # | |
Eq BigQueryTablesPatch | |
Defined in Gogol.BigQuery.Tables.Patch Methods (==) :: BigQueryTablesPatch -> BigQueryTablesPatch -> Bool # (/=) :: BigQueryTablesPatch -> BigQueryTablesPatch -> Bool # | |
Eq BigQueryTablesSetIamPolicy | |
Defined in Gogol.BigQuery.Tables.SetIamPolicy Methods (==) :: BigQueryTablesSetIamPolicy -> BigQueryTablesSetIamPolicy -> Bool # (/=) :: BigQueryTablesSetIamPolicy -> BigQueryTablesSetIamPolicy -> Bool # | |
Eq BigQueryTablesTestIamPermissions | |
Eq BigQueryTablesUpdate | |
Defined in Gogol.BigQuery.Tables.Update Methods (==) :: BigQueryTablesUpdate -> BigQueryTablesUpdate -> Bool # (/=) :: BigQueryTablesUpdate -> BigQueryTablesUpdate -> Bool # | |
Eq Base64 | |
Eq Date | |
Eq DateTime | |
Eq Duration | |
Eq Time | |
Eq AccessToken | |
Defined in Gogol.Types | |
Eq AltJSON | |
Eq AltMedia | |
Eq ClientId | |
Eq FieldMask | |
Eq GSecret | |
Eq Multipart | |
Eq OAuthScope | |
Defined in Gogol.Types | |
Eq RefreshToken | |
Defined in Gogol.Types | |
Eq Seconds | |
Eq SerializeError | |
Defined in Gogol.Types Methods (==) :: SerializeError -> SerializeError -> Bool # (/=) :: SerializeError -> SerializeError -> Bool # | |
Eq ServiceError | |
Defined in Gogol.Types | |
Eq ServiceId | |
Eq SrcLoc | |
Eq SrcSpan | |
Eq SrcSpanInfo | |
Defined in Language.Haskell.Exts.SrcLoc | |
Eq Boxed | |
Eq Tool | |
Eq AccessToken | |
Defined in Network.OAuth.OAuth2.Internal | |
Eq ClientAuthenticationMethod | |
Defined in Network.OAuth.OAuth2.Internal Methods (==) :: ClientAuthenticationMethod -> ClientAuthenticationMethod -> Bool # (/=) :: ClientAuthenticationMethod -> ClientAuthenticationMethod -> Bool # | |
Eq IdToken | |
Eq OAuth2 | |
Eq OAuth2Token | |
Defined in Network.OAuth.OAuth2.Internal | |
Eq RefreshToken | |
Defined in Network.OAuth.OAuth2.Internal | |
Eq IdpName | |
Eq Tix | |
Eq TixModule | |
Eq Hash | |
Eq HpcPos | |
Eq Form | |
Eq ConnHost | |
Eq ConnKey | |
Eq MaxHeaderLength | |
Defined in Network.HTTP.Client.Types Methods (==) :: MaxHeaderLength -> MaxHeaderLength -> Bool # (/=) :: MaxHeaderLength -> MaxHeaderLength -> Bool # | |
Eq Proxy | |
Eq ProxySecureMode | |
Defined in Network.HTTP.Client.Types Methods (==) :: ProxySecureMode -> ProxySecureMode -> Bool # (/=) :: ProxySecureMode -> ProxySecureMode -> Bool # | |
Eq ResponseTimeout | |
Defined in Network.HTTP.Client.Types Methods (==) :: ResponseTimeout -> ResponseTimeout -> Bool # (/=) :: ResponseTimeout -> ResponseTimeout -> Bool # | |
Eq StatusHeaders | |
Defined in Network.HTTP.Client.Types Methods (==) :: StatusHeaders -> StatusHeaders -> Bool # (/=) :: StatusHeaders -> StatusHeaders -> Bool # | |
Eq StreamFileStatus | |
Defined in Network.HTTP.Client.Types Methods (==) :: StreamFileStatus -> StreamFileStatus -> Bool # (/=) :: StreamFileStatus -> StreamFileStatus -> Bool # | |
Eq ByteRange | Since: http-types-0.8.4 |
Eq StdMethod | |
Eq Status | A |
Eq HttpVersion | |
Defined in Network.HTTP.Types.Version | |
Eq IP | Equality over IP addresses. Correctly compare IPv4 and IPv4-embedded-in-IPv6 addresses.
|
Eq IPv4 | |
Eq IPv6 | |
Eq IPRange | |
Eq Alg | |
Eq Enc | |
Eq JweAlg | |
Eq JwsAlg | |
Eq EcCurve | |
Eq Jwk | |
Eq JwkSet | |
Eq KeyType | |
Eq KeyUse | |
Eq IntDate | |
Eq JweHeader | |
Eq JwsHeader | |
Eq Jwt | |
Eq JwtContent | |
Defined in Jose.Types | |
Eq JwtEncoding | |
Defined in Jose.Types | |
Eq JwtError | |
Eq KeyId | |
Eq Payload | |
Eq Environment | |
Defined in Katip.Core | |
Eq LogStr | |
Eq Namespace | |
Eq PayloadSelection | |
Defined in Katip.Core Methods (==) :: PayloadSelection -> PayloadSelection -> Bool # (/=) :: PayloadSelection -> PayloadSelection -> Bool # | |
Eq ScribeSettings | |
Defined in Katip.Core Methods (==) :: ScribeSettings -> ScribeSettings -> Bool # (/=) :: ScribeSettings -> ScribeSettings -> Bool # | |
Eq Severity | |
Eq ThreadIdText | |
Defined in Katip.Core | |
Eq Verbosity | |
Eq ColorStrategy | |
Defined in Katip.Scribes.Handle Methods (==) :: ColorStrategy -> ColorStrategy -> Bool # (/=) :: ColorStrategy -> ColorStrategy -> Bool # | |
Eq DefName | |
Eq NCon | |
Eq InvalidPosException | |
Defined in Text.Megaparsec.Pos Methods (==) :: InvalidPosException -> InvalidPosException -> Bool # (/=) :: InvalidPosException -> InvalidPosException -> Bool # | |
Eq Pos | |
Eq SourcePos | |
Eq SpecMetaArgsOpt # | |
Defined in Napkin.Cli.SpecMetaArgs Methods (==) :: SpecMetaArgsOpt -> SpecMetaArgsOpt -> Bool # (/=) :: SpecMetaArgsOpt -> SpecMetaArgsOpt -> Bool # | |
Eq SpecFileArrayMergeStrategy # | |
Defined in Napkin.Cli.Types Methods (==) :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> Bool # (/=) :: SpecFileArrayMergeStrategy -> SpecFileArrayMergeStrategy -> Bool # | |
Eq SpecFileWithMergeStrategy # | |
Defined in Napkin.Cli.Types Methods (==) :: SpecFileWithMergeStrategy -> SpecFileWithMergeStrategy -> Bool # (/=) :: SpecFileWithMergeStrategy -> SpecFileWithMergeStrategy -> Bool # | |
Eq SpecFilesWithOverrides # | |
Defined in Napkin.Cli.Types Methods (==) :: SpecFilesWithOverrides -> SpecFilesWithOverrides -> Bool # (/=) :: SpecFilesWithOverrides -> SpecFilesWithOverrides -> Bool # | |
Eq CompareCount # | |
Defined in Napkin.Run.Effects.Hooks.Types | |
Eq CountTolerance # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods (==) :: CountTolerance -> CountTolerance -> Bool # (/=) :: CountTolerance -> CountTolerance -> Bool # | |
Eq AddedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods (==) :: AddedColumnPolicy -> AddedColumnPolicy -> Bool # (/=) :: AddedColumnPolicy -> AddedColumnPolicy -> Bool # | |
Eq DroppedColumnPolicy # | |
Defined in Napkin.Run.Effects.Programs Methods (==) :: DroppedColumnPolicy -> DroppedColumnPolicy -> Bool # (/=) :: DroppedColumnPolicy -> DroppedColumnPolicy -> Bool # | |
Eq SchemaMigrationOptions # | |
Defined in Napkin.Run.Effects.Programs Methods (==) :: SchemaMigrationOptions -> SchemaMigrationOptions -> Bool # (/=) :: SchemaMigrationOptions -> SchemaMigrationOptions -> Bool # | |
Eq AuthEvalError | |
Defined in Napkin.Auth.Types Methods (==) :: AuthEvalError -> AuthEvalError -> Bool # (/=) :: AuthEvalError -> AuthEvalError -> Bool # | |
Eq Dollars | |
Eq InvalidBigQueryRef | |
Defined in Napkin.Run.BigQuery.Context Methods (==) :: InvalidBigQueryRef -> InvalidBigQueryRef -> Bool # (/=) :: InvalidBigQueryRef -> InvalidBigQueryRef -> Bool # | |
Eq BigQueryRunError | |
Defined in Napkin.Run.BigQuery.Types Methods (==) :: BigQueryRunError -> BigQueryRunError -> Bool # (/=) :: BigQueryRunError -> BigQueryRunError -> Bool # | |
Eq DatasetIsMissing | |
Defined in Napkin.Run.BigQuery.Types Methods (==) :: DatasetIsMissing -> DatasetIsMissing -> Bool # (/=) :: DatasetIsMissing -> DatasetIsMissing -> Bool # | |
Eq StarExpansionNotSupported | |
Defined in Napkin.Run.BigQuery.Types Methods (==) :: StarExpansionNotSupported -> StarExpansionNotSupported -> Bool # (/=) :: StarExpansionNotSupported -> StarExpansionNotSupported -> Bool # | |
Eq BQDataSetId | |
Defined in Napkin.Types.BigQuery | |
Eq BQDataSetReference | |
Defined in Napkin.Types.BigQuery Methods (==) :: BQDataSetReference -> BQDataSetReference -> Bool # (/=) :: BQDataSetReference -> BQDataSetReference -> Bool # | |
Eq BQProjectId | |
Defined in Napkin.Types.BigQuery | |
Eq BQTableId | |
Eq BigQueryType | |
Defined in Napkin.Types.BigQuery | |
Eq JobInsertTableName | |
Defined in Napkin.Types.BigQuery Methods (==) :: JobInsertTableName -> JobInsertTableName -> Bool # (/=) :: JobInsertTableName -> JobInsertTableName -> Bool # | |
Eq MaterializedViewMeta | |
Defined in Napkin.Types.BigQuery Methods (==) :: MaterializedViewMeta -> MaterializedViewMeta -> Bool # (/=) :: MaterializedViewMeta -> MaterializedViewMeta -> Bool # | |
Eq MaterializedViewRefresh | |
Defined in Napkin.Types.BigQuery Methods (==) :: MaterializedViewRefresh -> MaterializedViewRefresh -> Bool # (/=) :: MaterializedViewRefresh -> MaterializedViewRefresh -> Bool # | |
Eq PartitionInterval | |
Defined in Napkin.Types.BigQuery Methods (==) :: PartitionInterval -> PartitionInterval -> Bool # (/=) :: PartitionInterval -> PartitionInterval -> Bool # | |
Eq RangeWithStep | |
Defined in Napkin.Types.BigQuery Methods (==) :: RangeWithStep -> RangeWithStep -> Bool # (/=) :: RangeWithStep -> RangeWithStep -> Bool # | |
Eq TableMeta | |
Eq TablePartitioning | |
Defined in Napkin.Types.BigQuery Methods (==) :: TablePartitioning -> TablePartitioning -> Bool # (/=) :: TablePartitioning -> TablePartitioning -> Bool # | |
Eq TimePartitioning | |
Defined in Napkin.Types.BigQuery Methods (==) :: TimePartitioning -> TimePartitioning -> Bool # (/=) :: TimePartitioning -> TimePartitioning -> Bool # | |
Eq ViewMeta | |
Eq WriteDisposition | |
Defined in Napkin.Types.BigQuery Methods (==) :: WriteDisposition -> WriteDisposition -> Bool # (/=) :: WriteDisposition -> WriteDisposition -> Bool # | |
Eq JoinOnPredicate | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods (==) :: JoinOnPredicate -> JoinOnPredicate -> Bool # (/=) :: JoinOnPredicate -> JoinOnPredicate -> Bool # | |
Eq Merge | |
Eq TableAlias | |
Defined in Napkin.Types.Commands.BigQuery.Merge | |
Eq WhenMatched | |
Defined in Napkin.Types.Commands.BigQuery.Merge | |
Eq WhenNotMatched | |
Defined in Napkin.Types.Commands.BigQuery.Merge Methods (==) :: WhenNotMatched -> WhenNotMatched -> Bool # (/=) :: WhenNotMatched -> WhenNotMatched -> Bool # | |
Eq JSONPath | |
Eq MsSchemaField | |
Defined in Napkin.Types.MsSql Methods (==) :: MsSchemaField -> MsSchemaField -> Bool # (/=) :: MsSchemaField -> MsSchemaField -> Bool # | |
Eq MsSqlMaterializedViewMeta | |
Defined in Napkin.Types.MsSql Methods (==) :: MsSqlMaterializedViewMeta -> MsSqlMaterializedViewMeta -> Bool # (/=) :: MsSqlMaterializedViewMeta -> MsSqlMaterializedViewMeta -> Bool # | |
Eq SetTableSchema | |
Defined in Napkin.Types.MsSql Methods (==) :: SetTableSchema -> SetTableSchema -> Bool # (/=) :: SetTableSchema -> SetTableSchema -> Bool # | |
Eq PGSchemaField | |
Defined in Napkin.Run.PGCommon Methods (==) :: PGSchemaField -> PGSchemaField -> Bool # (/=) :: PGSchemaField -> PGSchemaField -> Bool # | |
Eq CreateIndex | |
Defined in Napkin.Types.Postgres | |
Eq MaterializedViewMeta | |
Defined in Napkin.Types.Postgres Methods (==) :: MaterializedViewMeta -> MaterializedViewMeta -> Bool # (/=) :: MaterializedViewMeta -> MaterializedViewMeta -> Bool # | |
Eq SetTableSchema | |
Defined in Napkin.Types.Postgres Methods (==) :: SetTableSchema -> SetTableSchema -> Bool # (/=) :: SetTableSchema -> SetTableSchema -> Bool # | |
Eq TableMeta | |
Eq Index | |
Eq ContinuousAggregatePolicy | |
Defined in Napkin.Types.Postgres.Timescale Methods (==) :: ContinuousAggregatePolicy -> ContinuousAggregatePolicy -> Bool # (/=) :: ContinuousAggregatePolicy -> ContinuousAggregatePolicy -> Bool # | |
Eq ContinuousViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods (==) :: ContinuousViewMeta -> ContinuousViewMeta -> Bool # (/=) :: ContinuousViewMeta -> ContinuousViewMeta -> Bool # | |
Eq RetentionPolicy | |
Defined in Napkin.Types.Postgres.Timescale Methods (==) :: RetentionPolicy -> RetentionPolicy -> Bool # (/=) :: RetentionPolicy -> RetentionPolicy -> Bool # | |
Eq TimescaleViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods (==) :: TimescaleViewMeta -> TimescaleViewMeta -> Bool # (/=) :: TimescaleViewMeta -> TimescaleViewMeta -> Bool # | |
Eq DistStyle | |
Eq SortKey | |
Eq SortStyle | |
Eq TableMeta | |
Eq CaseSensitivity | |
Defined in Napkin.Untyped.Ops.Redshift Methods (==) :: CaseSensitivity -> CaseSensitivity -> Bool # (/=) :: CaseSensitivity -> CaseSensitivity -> Bool # | |
Eq SqliteSchemaError | |
Defined in Napkin.Run.Sqlite Methods (==) :: SqliteSchemaError -> SqliteSchemaError -> Bool # (/=) :: SqliteSchemaError -> SqliteSchemaError -> Bool # | |
Eq SqliteMaterializedViewMeta | |
Defined in Napkin.Types.Sqlite Methods (==) :: SqliteMaterializedViewMeta -> SqliteMaterializedViewMeta -> Bool # (/=) :: SqliteMaterializedViewMeta -> SqliteMaterializedViewMeta -> Bool # | |
Eq AggLevel | |
Eq ArrayBase | |
Eq AsStruct | |
Eq CteBody | |
Eq DatePart | |
Eq Distinctness | |
Defined in Napkin.Types.Core | |
Eq ExternFun | |
Eq FrameLength | |
Defined in Napkin.Types.Core | |
Eq From | |
Eq FunModifier | |
Defined in Napkin.Types.Core | |
Eq IntInterval | |
Defined in Napkin.Types.Core | |
Eq Interval | |
Eq JoinType | |
Eq Name | |
Eq NativeExpr | |
Defined in Napkin.Types.Core | |
Eq NativeQuery | |
Defined in Napkin.Types.Core | |
Eq NullOrder | |
Eq NullStrategy | |
Defined in Napkin.Types.Core | |
Eq Nullability | |
Defined in Napkin.Types.Core | |
Eq OrderDir | |
Eq OrderPart | |
Eq ParensOperator | |
Defined in Napkin.Types.Core Methods (==) :: ParensOperator -> ParensOperator -> Bool # (/=) :: ParensOperator -> ParensOperator -> Bool # | |
Eq ParensOperatorArgument | |
Defined in Napkin.Types.Core Methods (==) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (/=) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # | |
Eq Query | |
Eq RawQuery | |
Eq Relation | |
Eq SExp | |
Eq SpecDependency | |
Defined in Napkin.Types.Core Methods (==) :: SpecDependency -> SpecDependency -> Bool # (/=) :: SpecDependency -> SpecDependency -> Bool # | |
Eq SpecNode | |
Eq SpecTableName | |
Defined in Napkin.Types.Core Methods (==) :: SpecTableName -> SpecTableName -> Bool # (/=) :: SpecTableName -> SpecTableName -> Bool # | |
Eq StructField | |
Defined in Napkin.Types.Core | |
Eq TableKind | |
Eq Type | |
Eq UnionType | |
Eq UpdateQuery | |
Defined in Napkin.Types.Core | |
Eq Value | |
Eq WOver | |
Eq WindowFrame | |
Defined in Napkin.Types.Core | |
Eq WindowFrameUnit | |
Defined in Napkin.Types.Core Methods (==) :: WindowFrameUnit -> WindowFrameUnit -> Bool # (/=) :: WindowFrameUnit -> WindowFrameUnit -> Bool # | |
Eq WithClauses | |
Defined in Napkin.Types.Core | |
Eq Estimate | |
Eq ComBombShell | |
Defined in Napkin.Backends.MsSql.ApiGen.Types | |
Eq GenFunctionOpt | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: GenFunctionOpt -> GenFunctionOpt -> Bool # (/=) :: GenFunctionOpt -> GenFunctionOpt -> Bool # | |
Eq JsonNullStrategy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: JsonNullStrategy -> JsonNullStrategy -> Bool # (/=) :: JsonNullStrategy -> JsonNullStrategy -> Bool # | |
Eq MsSqlApiDefExpr | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: MsSqlApiDefExpr -> MsSqlApiDefExpr -> Bool # (/=) :: MsSqlApiDefExpr -> MsSqlApiDefExpr -> Bool # | |
Eq MsSqlApiParserSt | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: MsSqlApiParserSt -> MsSqlApiParserSt -> Bool # (/=) :: MsSqlApiParserSt -> MsSqlApiParserSt -> Bool # | |
Eq MsSqlApiUnitDef | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: MsSqlApiUnitDef -> MsSqlApiUnitDef -> Bool # (/=) :: MsSqlApiUnitDef -> MsSqlApiUnitDef -> Bool # | |
Eq NthHtmlNode | |
Defined in Napkin.Backends.MsSql.ApiGen.Types | |
Eq NthStmtInHtmlNode | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: NthStmtInHtmlNode -> NthStmtInHtmlNode -> Bool # (/=) :: NthStmtInHtmlNode -> NthStmtInHtmlNode -> Bool # | |
Eq OverOrderBy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types | |
Eq OverOrderByField | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: OverOrderByField -> OverOrderByField -> Bool # (/=) :: OverOrderByField -> OverOrderByField -> Bool # | |
Eq PartitionBy | |
Defined in Napkin.Backends.MsSql.ApiGen.Types | |
Eq RowRange | |
Eq RowRangeBound | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods (==) :: RowRangeBound -> RowRangeBound -> Bool # (/=) :: RowRangeBound -> RowRangeBound -> Bool # | |
Eq SubDefMeta | |
Defined in Napkin.Backends.MsSql.ApiGen.Types | |
Eq LogLineFormat | |
Defined in Napkin.Logging Methods (==) :: LogLineFormat -> LogLineFormat -> Bool # (/=) :: LogLineFormat -> LogLineFormat -> Bool # | |
Eq LogOptions | |
Defined in Napkin.Logging | |
Eq LogTarget | |
Eq SQLDialect | |
Defined in Napkin.Parse.Base | |
Eq InterpolationError | |
Defined in Napkin.Parse.Interpolation.Types Methods (==) :: InterpolationError -> InterpolationError -> Bool # (/=) :: InterpolationError -> InterpolationError -> Bool # | |
Eq InterpolationErrorDetails | |
Defined in Napkin.Parse.Interpolation.Types Methods (==) :: InterpolationErrorDetails -> InterpolationErrorDetails -> Bool # (/=) :: InterpolationErrorDetails -> InterpolationErrorDetails -> Bool # | |
Eq InterpolationMode | |
Defined in Napkin.Parse.Interpolation.Types Methods (==) :: InterpolationMode -> InterpolationMode -> Bool # (/=) :: InterpolationMode -> InterpolationMode -> Bool # | |
Eq SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods (==) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # (/=) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # | |
Eq ParseExc | |
Eq SimpleSQLParserDialect | |
Defined in Napkin.Parse.SimpleSqlParser.Dialect Methods (==) :: SimpleSQLParserDialect -> SimpleSQLParserDialect -> Bool # (/=) :: SimpleSQLParserDialect -> SimpleSQLParserDialect -> Bool # | |
Eq Artifacts | |
Eq Dependencies | |
Eq IState | |
Eq AssertionEntry | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionEntry -> AssertionEntry -> Bool # (/=) :: AssertionEntry -> AssertionEntry -> Bool # | |
Eq AssertionGroup | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionGroup -> AssertionGroup -> Bool # (/=) :: AssertionGroup -> AssertionGroup -> Bool # | |
Eq AssertionLog | |
Defined in Napkin.Run.Effects.Languages.Assertion | |
Eq AssertionSeverity | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionSeverity -> AssertionSeverity -> Bool # (/=) :: AssertionSeverity -> AssertionSeverity -> Bool # | |
Eq AssertionStatus | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionStatus -> AssertionStatus -> Bool # (/=) :: AssertionStatus -> AssertionStatus -> Bool # | |
Eq ExternalCommand | |
Defined in Napkin.Run.Effects.Languages.External Methods (==) :: ExternalCommand -> ExternalCommand -> Bool # (/=) :: ExternalCommand -> ExternalCommand -> Bool # | |
Eq LoadQueryError | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods (==) :: LoadQueryError -> LoadQueryError -> Bool # (/=) :: LoadQueryError -> LoadQueryError -> Bool # | |
Eq LocalFileError | |
Defined in Napkin.Run.Effects.Languages.LocalFile Methods (==) :: LocalFileError -> LocalFileError -> Bool # (/=) :: LocalFileError -> LocalFileError -> Bool # | |
Eq NapkinEffectError | |
Defined in Napkin.Run.Effects.Languages.NapkinError Methods (==) :: NapkinEffectError -> NapkinEffectError -> Bool # (/=) :: NapkinEffectError -> NapkinEffectError -> Bool # | |
Eq SqlParseError | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods (==) :: SqlParseError -> SqlParseError -> Bool # (/=) :: SqlParseError -> SqlParseError -> Bool # | |
Eq Cascade | |
Eq InsertColumnsList | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: InsertColumnsList -> InsertColumnsList -> Bool # (/=) :: InsertColumnsList -> InsertColumnsList -> Bool # | |
Eq MissingBehavior | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: MissingBehavior -> MissingBehavior -> Bool # (/=) :: MissingBehavior -> MissingBehavior -> Bool # | |
Eq TableWriteStrategy | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: TableWriteStrategy -> TableWriteStrategy -> Bool # (/=) :: TableWriteStrategy -> TableWriteStrategy -> Bool # | |
Eq CreateTableDDL | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: CreateTableDDL -> CreateTableDDL -> Bool # (/=) :: CreateTableDDL -> CreateTableDDL -> Bool # | |
Eq ExtendedStatement | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: ExtendedStatement -> ExtendedStatement -> Bool # (/=) :: ExtendedStatement -> ExtendedStatement -> Bool # | |
Eq InsertStatement | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: InsertStatement -> InsertStatement -> Bool # (/=) :: InsertStatement -> InsertStatement -> Bool # | |
Eq ExtraDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: ExtraDependencies -> ExtraDependencies -> Bool # (/=) :: ExtraDependencies -> ExtraDependencies -> Bool # | |
Eq HiddenArtifacts | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: HiddenArtifacts -> HiddenArtifacts -> Bool # (/=) :: HiddenArtifacts -> HiddenArtifacts -> Bool # | |
Eq HiddenDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: HiddenDependencies -> HiddenDependencies -> Bool # (/=) :: HiddenDependencies -> HiddenDependencies -> Bool # | |
Eq MetaArguments | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: MetaArguments -> MetaArguments -> Bool # (/=) :: MetaArguments -> MetaArguments -> Bool # | |
Eq TableMemo | |
Eq TemplateError | |
Defined in Napkin.Run.Effects.Languages.Template Methods (==) :: TemplateError -> TemplateError -> Bool # (/=) :: TemplateError -> TemplateError -> Bool # | |
Eq RenamerSchemaOverwriteBehavior | |
Defined in Napkin.Run.Effects.Preprocessor | |
Eq RenamerScope | |
Defined in Napkin.Run.Effects.Preprocessor | |
Eq HaskellEvaluationError | |
Defined in Napkin.Run.Types.ErrorReporting Methods (==) :: HaskellEvaluationError -> HaskellEvaluationError -> Bool # (/=) :: HaskellEvaluationError -> HaskellEvaluationError -> Bool # | |
Eq ValidationError | |
Defined in Napkin.Run.Types.ErrorReporting Methods (==) :: ValidationError -> ValidationError -> Bool # (/=) :: ValidationError -> ValidationError -> Bool # | |
Eq SourceLocation | |
Defined in Napkin.Run.Types.SourceLocation Methods (==) :: SourceLocation -> SourceLocation -> Bool # (/=) :: SourceLocation -> SourceLocation -> Bool # | |
Eq AppName | |
Eq AuthSpecFile | |
Defined in Napkin.Spec.Types.Runtime | |
Eq BkStatistics | |
Defined in Napkin.Spec.Types.Runtime | |
Eq UpdateStrategy | |
Defined in Napkin.Spec.Types.Spec Methods (==) :: UpdateStrategy -> UpdateStrategy -> Bool # (/=) :: UpdateStrategy -> UpdateStrategy -> Bool # | |
Eq SpecProgramArgumentDefaultValue | |
Defined in Napkin.Spec.Yaml.Types.Arguments | |
Eq ListedTable | |
Defined in Napkin.Types.Commands | |
Eq ListedTableKind | |
Defined in Napkin.Types.Commands Methods (==) :: ListedTableKind -> ListedTableKind -> Bool # (/=) :: ListedTableKind -> ListedTableKind -> Bool # | |
Eq NormalizedTable | |
Defined in Napkin.Types.Commands Methods (==) :: NormalizedTable -> NormalizedTable -> Bool # (/=) :: NormalizedTable -> NormalizedTable -> Bool # | |
Eq Prefix | |
Eq QState | |
Eq RefStore | |
Eq UState | |
Eq BackendFunctionMeta | |
Defined in Napkin.Untyped.Ops Methods (==) :: BackendFunctionMeta -> BackendFunctionMeta -> Bool # (/=) :: BackendFunctionMeta -> BackendFunctionMeta -> Bool # | |
Eq FileType | |
Eq AddrInfo | |
Eq AddrInfoFlag | |
Defined in Network.Socket.Info | |
Eq NameInfoFlag | |
Defined in Network.Socket.Info | |
Eq URI | |
Eq URIAuth | |
Eq Binary | |
Eq ODBCException | |
Defined in Database.ODBC.Internal Methods (==) :: ODBCException -> ODBCException -> Bool # (/=) :: ODBCException -> ODBCException -> Bool # | |
Eq Param | |
Eq RETCODE | |
Eq SQLCHAR | |
Eq SQLCTYPE | |
Eq SQLINTEGER | |
Eq SQLLEN | |
Eq SQLSMALLINT | |
Eq SQLUCHAR | |
Eq SQLUINTEGER | |
Eq SQLULEN | |
Eq SQLUSMALLINT | |
Eq SQLWCHAR | |
Eq Value | |
Eq Datetime2 | |
Eq Datetimeoffset | SQL Server considers two datetimeoffset values to be equal as long as they represent the same instant in time; i.e. they are equavalent to the same UTC time and date. This instance reproduces that behaviour. |
Defined in Database.ODBC.SQLServer Methods (==) :: Datetimeoffset -> Datetimeoffset -> Bool # (/=) :: Datetimeoffset -> Datetimeoffset -> Bool # | |
Eq FPart | |
Eq Part | |
Eq Query | |
Eq Smalldatetime | |
Defined in Database.ODBC.SQLServer Methods (==) :: Smalldatetime -> Smalldatetime -> Bool # (/=) :: Smalldatetime -> Smalldatetime -> Bool # | |
Eq Richness | |
Eq Parenthetic | |
Eq AltNodeType | |
Defined in Options.Applicative.Types | |
Eq ArgPolicy | |
Eq ArgumentReachability | |
Defined in Options.Applicative.Types Methods (==) :: ArgumentReachability -> ArgumentReachability -> Bool # (/=) :: ArgumentReachability -> ArgumentReachability -> Bool # | |
Eq Backtracking | |
Defined in Options.Applicative.Types | |
Eq OptName | |
Eq OptVisibility | |
Defined in Options.Applicative.Types Methods (==) :: OptVisibility -> OptVisibility -> Bool # (/=) :: OptVisibility -> OptVisibility -> Bool # | |
Eq ParserPrefs | |
Defined in Options.Applicative.Types | |
Eq OsChar | Byte equality of the internal representation. |
Eq OsString | Byte equality of the internal representation. |
Eq PosixChar | |
Eq PosixString | |
Defined in System.OsString.Internal.Types | |
Eq WindowsChar | |
Defined in System.OsString.Internal.Types | |
Eq WindowsString | |
Defined in System.OsString.Internal.Types Methods (==) :: WindowsString -> WindowsString -> Bool # (/=) :: WindowsString -> WindowsString -> Bool # | |
Eq PredType' | |
Eq OrdType | |
Eq SolveContext | |
Defined in Polysemy.Plugin.Fundep.Unification | |
Eq Unification | |
Defined in Polysemy.Plugin.Fundep.Unification | |
Eq ConnectInfo | |
Defined in Database.PostgreSQL.Simple.Internal | |
Eq Connection | |
Defined in Database.PostgreSQL.Simple.Internal | |
Eq FormatError | |
Defined in Database.PostgreSQL.Simple.Internal | |
Eq QueryError | |
Defined in Database.PostgreSQL.Simple.Internal | |
Eq SqlError | |
Eq AExpr | |
Eq AExprReversableOp | |
Defined in PostgresqlSyntax.Ast Methods (==) :: AExprReversableOp -> AExprReversableOp -> Bool # (/=) :: AExprReversableOp -> AExprReversableOp -> Bool # | |
Eq AexprConst | |
Defined in PostgresqlSyntax.Ast | |
Eq AliasClause | |
Defined in PostgresqlSyntax.Ast | |
Eq AllOp | |
Eq AnyName | |
Eq AnyOperator | |
Defined in PostgresqlSyntax.Ast | |
Eq ArrayExpr | |
Eq AscDesc | |
Eq BExpr | |
Eq BExprIsOp | |
Eq Bit | |
Eq CExpr | |
Eq CallStmt | |
Eq CaseExpr | |
Eq Character | |
Eq Columnref | |
Eq CommonTableExpr | |
Defined in PostgresqlSyntax.Ast Methods (==) :: CommonTableExpr -> CommonTableExpr -> Bool # (/=) :: CommonTableExpr -> CommonTableExpr -> Bool # | |
Eq ConfExpr | |
Eq ConstCharacter | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ConstCharacter -> ConstCharacter -> Bool # (/=) :: ConstCharacter -> ConstCharacter -> Bool # | |
Eq ConstDatetime | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ConstDatetime -> ConstDatetime -> Bool # (/=) :: ConstDatetime -> ConstDatetime -> Bool # | |
Eq ConstTypename | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ConstTypename -> ConstTypename -> Bool # (/=) :: ConstTypename -> ConstTypename -> Bool # | |
Eq DeleteStmt | |
Defined in PostgresqlSyntax.Ast | |
Eq ExtractArg | |
Defined in PostgresqlSyntax.Ast | |
Eq ExtractList | |
Defined in PostgresqlSyntax.Ast | |
Eq ForLockingClause | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ForLockingClause -> ForLockingClause -> Bool # (/=) :: ForLockingClause -> ForLockingClause -> Bool # | |
Eq ForLockingItem | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ForLockingItem -> ForLockingItem -> Bool # (/=) :: ForLockingItem -> ForLockingItem -> Bool # | |
Eq ForLockingStrength | |
Defined in PostgresqlSyntax.Ast Methods (==) :: ForLockingStrength -> ForLockingStrength -> Bool # (/=) :: ForLockingStrength -> ForLockingStrength -> Bool # | |
Eq FrameBound | |
Defined in PostgresqlSyntax.Ast | |
Eq FrameClause | |
Defined in PostgresqlSyntax.Ast | |
Eq FrameClauseMode | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FrameClauseMode -> FrameClauseMode -> Bool # (/=) :: FrameClauseMode -> FrameClauseMode -> Bool # | |
Eq FrameExtent | |
Defined in PostgresqlSyntax.Ast | |
Eq FuncAliasClause | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncAliasClause -> FuncAliasClause -> Bool # (/=) :: FuncAliasClause -> FuncAliasClause -> Bool # | |
Eq FuncApplication | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncApplication -> FuncApplication -> Bool # (/=) :: FuncApplication -> FuncApplication -> Bool # | |
Eq FuncApplicationParams | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncApplicationParams -> FuncApplicationParams -> Bool # (/=) :: FuncApplicationParams -> FuncApplicationParams -> Bool # | |
Eq FuncArgExpr | |
Defined in PostgresqlSyntax.Ast | |
Eq FuncConstArgs | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncConstArgs -> FuncConstArgs -> Bool # (/=) :: FuncConstArgs -> FuncConstArgs -> Bool # | |
Eq FuncExpr | |
Eq FuncExprCommonSubexpr | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncExprCommonSubexpr -> FuncExprCommonSubexpr -> Bool # (/=) :: FuncExprCommonSubexpr -> FuncExprCommonSubexpr -> Bool # | |
Eq FuncExprWindowless | |
Defined in PostgresqlSyntax.Ast Methods (==) :: FuncExprWindowless -> FuncExprWindowless -> Bool # (/=) :: FuncExprWindowless -> FuncExprWindowless -> Bool # | |
Eq FuncName | |
Eq FuncTable | |
Eq GenericType | |
Defined in PostgresqlSyntax.Ast | |
Eq GroupByItem | |
Defined in PostgresqlSyntax.Ast | |
Eq Ident | |
Eq ImplicitRow | |
Defined in PostgresqlSyntax.Ast | |
Eq InExpr | |
Eq IndexElem | |
Eq IndexElemDef | |
Defined in PostgresqlSyntax.Ast | |
Eq IndirectionEl | |
Defined in PostgresqlSyntax.Ast Methods (==) :: IndirectionEl -> IndirectionEl -> Bool # (/=) :: IndirectionEl -> IndirectionEl -> Bool # | |
Eq InsertColumnItem | |
Defined in PostgresqlSyntax.Ast Methods (==) :: InsertColumnItem -> InsertColumnItem -> Bool # (/=) :: InsertColumnItem -> InsertColumnItem -> Bool # | |
Eq InsertRest | |
Defined in PostgresqlSyntax.Ast | |
Eq InsertStmt | |
Defined in PostgresqlSyntax.Ast | |
Eq InsertTarget | |
Defined in PostgresqlSyntax.Ast | |
Eq Interval | |
Eq JoinMeth | |
Eq JoinQual | |
Eq JoinType | |
Eq JoinedTable | |
Defined in PostgresqlSyntax.Ast | |
Eq LimitClause | |
Defined in PostgresqlSyntax.Ast | |
Eq MathOp | |
Eq NullsOrder | |
Defined in PostgresqlSyntax.Ast | |
Eq Numeric | |
Eq OffsetClause | |
Defined in PostgresqlSyntax.Ast | |
Eq OnConflict | |
Defined in PostgresqlSyntax.Ast | |
Eq OnConflictDo | |
Defined in PostgresqlSyntax.Ast | |
Eq OptTempTableName | |
Defined in PostgresqlSyntax.Ast Methods (==) :: OptTempTableName -> OptTempTableName -> Bool # (/=) :: OptTempTableName -> OptTempTableName -> Bool # | |
Eq OverClause | |
Defined in PostgresqlSyntax.Ast | |
Eq OverlayList | |
Defined in PostgresqlSyntax.Ast | |
Eq OverrideKind | |
Defined in PostgresqlSyntax.Ast | |
Eq PositionList | |
Defined in PostgresqlSyntax.Ast | |
Eq PreparableStmt | |
Defined in PostgresqlSyntax.Ast Methods (==) :: PreparableStmt -> PreparableStmt -> Bool # (/=) :: PreparableStmt -> PreparableStmt -> Bool # | |
Eq QualAllOp | |
Eq QualOp | |
Eq QualifiedName | |
Defined in PostgresqlSyntax.Ast Methods (==) :: QualifiedName -> QualifiedName -> Bool # (/=) :: QualifiedName -> QualifiedName -> Bool # | |
Eq RelationExpr | |
Defined in PostgresqlSyntax.Ast | |
Eq RelationExprOptAlias | |
Defined in PostgresqlSyntax.Ast Methods (==) :: RelationExprOptAlias -> RelationExprOptAlias -> Bool # (/=) :: RelationExprOptAlias -> RelationExprOptAlias -> Bool # | |
Eq Row | |
Eq RowsfromItem | |
Defined in PostgresqlSyntax.Ast | |
Eq SelectBinOp | |
Defined in PostgresqlSyntax.Ast | |
Eq SelectFetchFirstValue | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SelectFetchFirstValue -> SelectFetchFirstValue -> Bool # (/=) :: SelectFetchFirstValue -> SelectFetchFirstValue -> Bool # | |
Eq SelectLimit | |
Defined in PostgresqlSyntax.Ast | |
Eq SelectLimitValue | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SelectLimitValue -> SelectLimitValue -> Bool # (/=) :: SelectLimitValue -> SelectLimitValue -> Bool # | |
Eq SelectNoParens | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SelectNoParens -> SelectNoParens -> Bool # (/=) :: SelectNoParens -> SelectNoParens -> Bool # | |
Eq SelectWithParens | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SelectWithParens -> SelectWithParens -> Bool # (/=) :: SelectWithParens -> SelectWithParens -> Bool # | |
Eq SetClause | |
Eq SetTarget | |
Eq SimpleSelect | |
Defined in PostgresqlSyntax.Ast | |
Eq SimpleTypename | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SimpleTypename -> SimpleTypename -> Bool # (/=) :: SimpleTypename -> SimpleTypename -> Bool # | |
Eq SortBy | |
Eq SubType | |
Eq SubqueryOp | |
Defined in PostgresqlSyntax.Ast | |
Eq SubstrList | |
Defined in PostgresqlSyntax.Ast | |
Eq SubstrListFromFor | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SubstrListFromFor -> SubstrListFromFor -> Bool # (/=) :: SubstrListFromFor -> SubstrListFromFor -> Bool # | |
Eq SymbolicExprBinOp | |
Defined in PostgresqlSyntax.Ast Methods (==) :: SymbolicExprBinOp -> SymbolicExprBinOp -> Bool # (/=) :: SymbolicExprBinOp -> SymbolicExprBinOp -> Bool # | |
Eq TableFuncElement | |
Defined in PostgresqlSyntax.Ast Methods (==) :: TableFuncElement -> TableFuncElement -> Bool # (/=) :: TableFuncElement -> TableFuncElement -> Bool # | |
Eq TableRef | |
Eq TablesampleClause | |
Defined in PostgresqlSyntax.Ast Methods (==) :: TablesampleClause -> TablesampleClause -> Bool # (/=) :: TablesampleClause -> TablesampleClause -> Bool # | |
Eq TargetEl | |
Eq Targeting | |
Eq TrimList | |
Eq TrimModifier | |
Defined in PostgresqlSyntax.Ast | |
Eq Typename | |
Eq TypenameArrayDimensions | |
Defined in PostgresqlSyntax.Ast Methods (==) :: TypenameArrayDimensions -> TypenameArrayDimensions -> Bool # (/=) :: TypenameArrayDimensions -> TypenameArrayDimensions -> Bool # | |
Eq UpdateStmt | |
Defined in PostgresqlSyntax.Ast | |
Eq VerbalExprBinOp | |
Defined in PostgresqlSyntax.Ast Methods (==) :: VerbalExprBinOp -> VerbalExprBinOp -> Bool # (/=) :: VerbalExprBinOp -> VerbalExprBinOp -> Bool # | |
Eq WhenClause | |
Defined in PostgresqlSyntax.Ast | |
Eq WhereOrCurrentClause | |
Defined in PostgresqlSyntax.Ast Methods (==) :: WhereOrCurrentClause -> WhereOrCurrentClause -> Bool # (/=) :: WhereOrCurrentClause -> WhereOrCurrentClause -> Bool # | |
Eq WindowDefinition | |
Defined in PostgresqlSyntax.Ast Methods (==) :: WindowDefinition -> WindowDefinition -> Bool # (/=) :: WindowDefinition -> WindowDefinition -> Bool # | |
Eq WindowExclusionClause | |
Defined in PostgresqlSyntax.Ast Methods (==) :: WindowExclusionClause -> WindowExclusionClause -> Bool # (/=) :: WindowExclusionClause -> WindowExclusionClause -> Bool # | |
Eq WindowSpecification | |
Defined in PostgresqlSyntax.Ast Methods (==) :: WindowSpecification -> WindowSpecification -> Bool # (/=) :: WindowSpecification -> WindowSpecification -> Bool # | |
Eq WithClause | |
Defined in PostgresqlSyntax.Ast | |
Eq Mode | |
Eq Style | |
Eq TextDetails | |
Defined in Text.PrettyPrint.Annotated.HughesPJ | |
Eq Doc | |
Eq ColorOptions | |
Defined in Text.Pretty.Simple.Internal.Color | |
Eq Style | |
Eq Expr | |
Eq Annotation | |
Defined in Text.Pretty.Simple.Internal.Printer | |
Eq CheckColorTty | |
Defined in Text.Pretty.Simple.Internal.Printer Methods (==) :: CheckColorTty -> CheckColorTty -> Bool # (/=) :: CheckColorTty -> CheckColorTty -> Bool # | |
Eq OutputOptions | |
Defined in Text.Pretty.Simple.Internal.Printer Methods (==) :: OutputOptions -> OutputOptions -> Bool # (/=) :: OutputOptions -> OutputOptions -> Bool # | |
Eq StringOutputStyle | |
Defined in Text.Pretty.Simple.Internal.Printer Methods (==) :: StringOutputStyle -> StringOutputStyle -> Bool # (/=) :: StringOutputStyle -> StringOutputStyle -> Bool # | |
Eq FusionDepth | |
Defined in Prettyprinter.Internal | |
Eq LayoutOptions | |
Defined in Prettyprinter.Internal Methods (==) :: LayoutOptions -> LayoutOptions -> Bool # (/=) :: LayoutOptions -> LayoutOptions -> Bool # | |
Eq PageWidth | |
Eq AnsiStyle | |
Eq Bold | |
Eq Color | |
Eq Intensity | |
Eq Italicized | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Eq Layer | |
Eq Underlined | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Eq StdGen | |
Eq CompOption | |
Defined in Text.Regex.Posix.Wrap | |
Eq ExecOption | |
Defined in Text.Regex.Posix.Wrap | |
Eq ReturnCode | |
Defined in Text.Regex.Posix.Wrap | |
Eq Undefined | |
Eq RetryAction | |
Defined in Control.Retry | |
Eq RetryStatus | |
Defined in Control.Retry | |
Eq LogLevel | |
Eq Scientific | Scientific numbers can be safely compared for equality. No magnitude |
Defined in Data.Scientific | |
Eq AcceptHeader | |
Defined in Servant.API.ContentTypes | |
Eq NoContent | |
Eq IsSecure | |
Eq LinkArrayElementStyle | |
Defined in Servant.Links Methods (==) :: LinkArrayElementStyle -> LinkArrayElementStyle -> Bool # (/=) :: LinkArrayElementStyle -> LinkArrayElementStyle -> Bool # | |
Eq AlterTableOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods (==) :: AlterTableOptions -> AlterTableOptions -> Bool # (/=) :: AlterTableOptions -> AlterTableOptions -> Bool # | |
Eq Dialect | |
Eq KeywordMode | |
Defined in Language.SQL.SimpleSQL.Dialect | |
Eq SetOperatorOptions | |
Defined in Language.SQL.SimpleSQL.Dialect Methods (==) :: SetOperatorOptions -> SetOperatorOptions -> Bool # (/=) :: SetOperatorOptions -> SetOperatorOptions -> Bool # | |
Eq TrieKey | |
Eq TrieNodeKey | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie | |
Eq CaseEquality | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq CodePointBase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: CodePointBase -> CodePointBase -> Bool # (/=) :: CodePointBase -> CodePointBase -> Bool # | |
Eq CodePointDigits | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: CodePointDigits -> CodePointDigits -> Bool # (/=) :: CodePointDigits -> CodePointDigits -> Bool # | |
Eq EscMode | |
Eq EscapeFallBack | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: EscapeFallBack -> EscapeFallBack -> Bool # (/=) :: EscapeFallBack -> EscapeFallBack -> Bool # | |
Eq EscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq InLowCase | |
Eq InSource | |
Eq KeyCharEventHandler | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: KeyCharEventHandler -> KeyCharEventHandler -> Bool # (/=) :: KeyCharEventHandler -> KeyCharEventHandler -> Bool # | |
Eq LetterCase | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq QuotationRuleIndex | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: QuotationRuleIndex -> QuotationRuleIndex -> Bool # (/=) :: QuotationRuleIndex -> QuotationRuleIndex -> Bool # | |
Eq QuotePrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq QuotingChars | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq ScapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq ScapingRule | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq SrcLitStr | |
Eq StrLitFmt | |
Eq StrLitId | |
Eq StrLitPrefix | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types | |
Eq UnEscapeParams | |
Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types Methods (==) :: UnEscapeParams -> UnEscapeParams -> Bool # (/=) :: UnEscapeParams -> UnEscapeParams -> Bool # | |
Eq SQLToken | |
Eq SrcPos | |
Eq WithPos | |
Eq AdminOption | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq AdminOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: AdminOptionFor -> AdminOptionFor -> Bool # (/=) :: AdminOptionFor -> AdminOptionFor -> Bool # | |
Eq Alias | |
Eq AlterDomainAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: AlterDomainAction -> AlterDomainAction -> Bool # (/=) :: AlterDomainAction -> AlterDomainAction -> Bool # | |
Eq AlterTableAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: AlterTableAction -> AlterTableAction -> Bool # (/=) :: AlterTableAction -> AlterTableAction -> Bool # | |
Eq AnonymousStruct | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: AnonymousStruct -> AnonymousStruct -> Bool # (/=) :: AnonymousStruct -> AnonymousStruct -> Bool # | |
Eq AsStruct | |
Eq BqStructExpr | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq CastSafe | |
Eq CheckOption | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq ColConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ColConstraint -> ColConstraint -> Bool # (/=) :: ColConstraint -> ColConstraint -> Bool # | |
Eq ColConstraintDef | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ColConstraintDef -> ColConstraintDef -> Bool # (/=) :: ColConstraintDef -> ColConstraintDef -> Bool # | |
Eq ColumnDef | |
Eq Comment | |
Eq CompPredQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: CompPredQuantifier -> CompPredQuantifier -> Bool # (/=) :: CompPredQuantifier -> CompPredQuantifier -> Bool # | |
Eq Corresponding | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: Corresponding -> Corresponding -> Bool # (/=) :: Corresponding -> Corresponding -> Bool # | |
Eq DefaultClause | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: DefaultClause -> DefaultClause -> Bool # (/=) :: DefaultClause -> DefaultClause -> Bool # | |
Eq Direction | |
Eq DropBehaviour | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: DropBehaviour -> DropBehaviour -> Bool # (/=) :: DropBehaviour -> DropBehaviour -> Bool # | |
Eq Frame | |
Eq FramePos | |
Eq FrameRows | |
Eq GrantOption | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq GrantOptionFor | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: GrantOptionFor -> GrantOptionFor -> Bool # (/=) :: GrantOptionFor -> GrantOptionFor -> Bool # | |
Eq GroupingExpr | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq IdentityRestart | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: IdentityRestart -> IdentityRestart -> Bool # (/=) :: IdentityRestart -> IdentityRestart -> Bool # | |
Eq IdentityWhen | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq InPredValue | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq InsertSource | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq IntervalTypeField | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: IntervalTypeField -> IntervalTypeField -> Bool # (/=) :: IntervalTypeField -> IntervalTypeField -> Bool # | |
Eq JoinCondition | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: JoinCondition -> JoinCondition -> Bool # (/=) :: JoinCondition -> JoinCondition -> Bool # | |
Eq JoinType | |
Eq Name | |
Eq NullsOrder | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq NullsRespect | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq ParensOperator | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ParensOperator -> ParensOperator -> Bool # (/=) :: ParensOperator -> ParensOperator -> Bool # | |
Eq ParensOperatorArgument | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (/=) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # | |
Eq PrecMultiplier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: PrecMultiplier -> PrecMultiplier -> Bool # (/=) :: PrecMultiplier -> PrecMultiplier -> Bool # | |
Eq PrecUnits | |
Eq PrivilegeAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: PrivilegeAction -> PrivilegeAction -> Bool # (/=) :: PrivilegeAction -> PrivilegeAction -> Bool # | |
Eq PrivilegeObject | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: PrivilegeObject -> PrivilegeObject -> Bool # (/=) :: PrivilegeObject -> PrivilegeObject -> Bool # | |
Eq QueryExpr | |
Eq ReferenceMatch | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ReferenceMatch -> ReferenceMatch -> Bool # (/=) :: ReferenceMatch -> ReferenceMatch -> Bool # | |
Eq ReferentialAction | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: ReferentialAction -> ReferentialAction -> Bool # (/=) :: ReferentialAction -> ReferentialAction -> Bool # | |
Eq ScalarExpr | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq SequenceGeneratorOption | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: SequenceGeneratorOption -> SequenceGeneratorOption -> Bool # (/=) :: SequenceGeneratorOption -> SequenceGeneratorOption -> Bool # | |
Eq SetClause | |
Eq SetOperatorName | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: SetOperatorName -> SetOperatorName -> Bool # (/=) :: SetOperatorName -> SetOperatorName -> Bool # | |
Eq SetQuantifier | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: SetQuantifier -> SetQuantifier -> Bool # (/=) :: SetQuantifier -> SetQuantifier -> Bool # | |
Eq Sign | |
Eq SortSpec | |
Eq Statement | |
Eq SubQueryExprType | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: SubQueryExprType -> SubQueryExprType -> Bool # (/=) :: SubQueryExprType -> SubQueryExprType -> Bool # | |
Eq TableConstraint | |
Defined in Language.SQL.SimpleSQL.Syntax Methods (==) :: TableConstraint -> TableConstraint -> Bool # (/=) :: TableConstraint -> TableConstraint -> Bool # | |
Eq TableElement | |
Defined in Language.SQL.SimpleSQL.Syntax | |
Eq TableRef | |
Eq TypeName | |
Eq Key | |
Eq MustacheException | |
Defined in Text.Mustache.Type Methods (==) :: MustacheException -> MustacheException -> Bool # (/=) :: MustacheException -> MustacheException -> Bool # | |
Eq MustacheWarning | |
Defined in Text.Mustache.Type Methods (==) :: MustacheWarning -> MustacheWarning -> Bool # (/=) :: MustacheWarning -> MustacheWarning -> Bool # | |
Eq Node | |
Eq PName | |
Eq Template | |
Eq Leniency | |
Eq AnnLookup | |
Eq AnnTarget | |
Eq Bang | |
Eq BndrVis | |
Eq Body | |
Eq Bytes | |
Eq Callconv | |
Eq Clause | |
Eq Con | |
Eq Dec | |
Eq DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: DecidedStrictness -> DecidedStrictness -> Bool # (/=) :: DecidedStrictness -> DecidedStrictness -> Bool # | |
Eq DerivClause | |
Defined in Language.Haskell.TH.Syntax | |
Eq DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: DerivStrategy -> DerivStrategy -> Bool # (/=) :: DerivStrategy -> DerivStrategy -> Bool # | |
Eq DocLoc | |
Eq Exp | |
Eq FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: FamilyResultSig -> FamilyResultSig -> Bool # (/=) :: FamilyResultSig -> FamilyResultSig -> Bool # | |
Eq Fixity | |
Eq FixityDirection | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: FixityDirection -> FixityDirection -> Bool # (/=) :: FixityDirection -> FixityDirection -> Bool # | |
Eq Foreign | |
Eq FunDep | |
Eq Guard | |
Eq Info | |
Eq InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: InjectivityAnn -> InjectivityAnn -> Bool # (/=) :: InjectivityAnn -> InjectivityAnn -> Bool # | |
Eq Inline | |
Eq Lit | |
Eq Loc | |
Eq Match | |
Eq ModName | |
Eq Module | |
Eq ModuleInfo | |
Defined in Language.Haskell.TH.Syntax | |
Eq Name | |
Eq NameFlavour | |
Defined in Language.Haskell.TH.Syntax | |
Eq NameSpace | |
Eq NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (/=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # | |
Eq OccName | |
Eq Overlap | |
Eq Pat | |
Eq PatSynArgs | |
Defined in Language.Haskell.TH.Syntax | |
Eq PatSynDir | |
Eq Phases | |
Eq PkgName | |
Eq Pragma | |
Eq Range | |
Eq Role | |
Eq RuleBndr | |
Eq RuleMatch | |
Eq Safety | |
Eq SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: SourceStrictness -> SourceStrictness -> Bool # (/=) :: SourceStrictness -> SourceStrictness -> Bool # | |
Eq SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # | |
Eq Specificity | |
Defined in Language.Haskell.TH.Syntax | |
Eq Stmt | |
Eq TyLit | |
Eq TySynEqn | |
Eq Type | |
Eq TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (/=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # | |
Eq UnicodeException | |
Defined in Data.Text.Encoding.Error Methods (==) :: UnicodeException -> UnicodeException -> Bool # (/=) :: UnicodeException -> UnicodeException -> Bool # | |
Eq I8 | |
Eq Builder | |
Eq PartialUtf8CodePoint | |
Eq Utf8State | |
Eq DecoderState | |
Defined in Data.Text.Internal.Encoding.Utf8 | |
Eq Size | |
Eq B | |
Eq ShortText | |
Eq ConstructorInfo | |
Defined in Language.Haskell.TH.Datatype Methods (==) :: ConstructorInfo -> ConstructorInfo -> Bool # (/=) :: ConstructorInfo -> ConstructorInfo -> Bool # | |
Eq ConstructorVariant | |
Defined in Language.Haskell.TH.Datatype Methods (==) :: ConstructorVariant -> ConstructorVariant -> Bool # (/=) :: ConstructorVariant -> ConstructorVariant -> Bool # | |
Eq DatatypeInfo | |
Defined in Language.Haskell.TH.Datatype | |
Eq DatatypeVariant | |
Defined in Language.Haskell.TH.Datatype Methods (==) :: DatatypeVariant -> DatatypeVariant -> Bool # (/=) :: DatatypeVariant -> DatatypeVariant -> Bool # | |
Eq FieldStrictness | |
Defined in Language.Haskell.TH.Datatype Methods (==) :: FieldStrictness -> FieldStrictness -> Bool # (/=) :: FieldStrictness -> FieldStrictness -> Bool # | |
Eq Strictness | |
Defined in Language.Haskell.TH.Datatype | |
Eq Unpackedness | |
Defined in Language.Haskell.TH.Datatype | |
Eq CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (==) :: CalendarDiffDays -> CalendarDiffDays -> Bool # (/=) :: CalendarDiffDays -> CalendarDiffDays -> Bool # | |
Eq Day | |
Eq Month | |
Eq Quarter | |
Eq QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods (==) :: QuarterOfYear -> QuarterOfYear -> Bool # (/=) :: QuarterOfYear -> QuarterOfYear -> Bool # | |
Eq DayOfWeek | |
Eq FirstWeekType | |
Defined in Data.Time.Calendar.WeekDate Methods (==) :: FirstWeekType -> FirstWeekType -> Bool # (/=) :: FirstWeekType -> FirstWeekType -> Bool # | |
Eq DiffTime | |
Eq NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (==) :: NominalDiffTime -> NominalDiffTime -> Bool # (/=) :: NominalDiffTime -> NominalDiffTime -> Bool # | |
Eq SystemTime | |
Defined in Data.Time.Clock.Internal.SystemTime | |
Eq UTCTime | |
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 UnixDiffTime | |
Defined in Data.UnixTime.Types | |
Eq UnixTime | |
Eq ConcException | |
Defined in UnliftIO.Internals.Async Methods (==) :: ConcException -> ConcException -> Bool # (/=) :: ConcException -> ConcException -> Bool # | |
Eq Authority | |
Eq Host | |
Eq Port | |
Eq Query | |
Eq SchemaError | |
Defined in URI.ByteString.Types | |
Eq Scheme | |
Eq URINormalizationOptions | |
Defined in URI.ByteString.Types Methods (==) :: URINormalizationOptions -> URINormalizationOptions -> Bool # (/=) :: URINormalizationOptions -> URINormalizationOptions -> Bool # | |
Eq URIParseError | |
Defined in URI.ByteString.Types Methods (==) :: URIParseError -> URIParseError -> Bool # (/=) :: URIParseError -> URIParseError -> Bool # | |
Eq UserInfo | |
Eq UUID | |
Eq UnpackedUUID | |
Defined in Data.UUID.Types.Internal | |
Eq Content | |
Eq Doctype | |
Eq Document | |
Eq Element | |
Eq Event | |
Eq ExternalID | |
Defined in Data.XML.Types | |
Eq Instruction | |
Defined in Data.XML.Types | |
Eq Miscellaneous | |
Defined in Data.XML.Types Methods (==) :: Miscellaneous -> Miscellaneous -> Bool # (/=) :: Miscellaneous -> Miscellaneous -> Bool # | |
Eq Name | |
Eq Node | |
Eq Prologue | |
Eq CompressionLevel | |
Defined in Codec.Compression.Zlib.Stream Methods (==) :: CompressionLevel -> CompressionLevel -> Bool # (/=) :: CompressionLevel -> CompressionLevel -> Bool # | |
Eq CompressionStrategy | |
Defined in Codec.Compression.Zlib.Stream Methods (==) :: CompressionStrategy -> CompressionStrategy -> Bool # (/=) :: CompressionStrategy -> CompressionStrategy -> Bool # | |
Eq DictionaryHash | |
Eq Format | |
Eq MemoryLevel | |
Defined in Codec.Compression.Zlib.Stream | |
Eq Method | |
Eq WindowBits | |
Defined in Codec.Compression.Zlib.Stream | |
Eq Integer | |
Eq Natural | |
Eq () | |
Eq Bool | |
Eq Char | |
Eq Double | Note that due to the presence of
Also note that
|
Eq Float | Note that due to the presence of
Also note that
|
Eq Int | |
Eq Word | |
Eq a => Eq (Only a) | |
Eq (Encoding' a) | |
Eq v => Eq (KeyMap v) | |
Eq a => Eq (IResult a) | |
Eq a => Eq (Result a) | |
Eq a => Eq (WithJSONWarnings a) | |
Defined in Data.Aeson.WarningParser Methods (==) :: WithJSONWarnings a -> WithJSONWarnings a -> Bool # (/=) :: WithJSONWarnings a -> WithJSONWarnings a -> Bool # | |
Eq (Chan a) | Since: base-4.4.0.0 |
Eq (MutableByteArray s) | Since: base-4.17.0.0 |
Defined in Data.Array.Byte Methods (==) :: MutableByteArray s -> MutableByteArray s -> Bool # (/=) :: MutableByteArray s -> MutableByteArray s -> Bool # | |
Eq a => Eq (Complex a) | Since: base-2.1 |
Eq a => Eq (First a) | Since: base-4.9.0.0 |
Eq a => Eq (Last a) | Since: base-4.9.0.0 |
Eq a => Eq (Max a) | Since: base-4.9.0.0 |
Eq a => Eq (Min a) | Since: base-4.9.0.0 |
Eq m => Eq (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods (==) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (/=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # | |
Eq (Bits n) | |
(PrimType ty, Eq ty) => Eq (Block ty) | |
Eq (Zn n) | |
Eq (Zn64 n) | |
Eq a => Eq (NonEmpty a) | |
Eq (CountOf ty) | |
Eq (Offset ty) | |
(PrimType ty, Eq ty) => Eq (UArray ty) | |
Eq a => Eq (Flush a) | |
Eq vertex => Eq (SCC vertex) | Since: containers-0.5.9 |
Eq a => Eq (IntMap a) | |
Eq a => Eq (Seq a) | |
Eq a => Eq (ViewL a) | |
Eq a => Eq (ViewR a) | |
Eq a => Eq (Intersection a) | |
Defined in Data.Set.Internal Methods (==) :: Intersection a -> Intersection a -> Bool # (/=) :: Intersection a -> Intersection a -> Bool # | |
Eq a => Eq (Set a) | |
Eq a => Eq (Tree a) | |
Eq a => Eq (CryptoFailable a) | |
Defined in Crypto.Error.Types Methods (==) :: CryptoFailable a -> CryptoFailable a -> Bool # (/=) :: CryptoFailable a -> CryptoFailable a -> Bool # | |
Eq (Digest a) | |
Eq a => Eq (CryptoFailable a) | |
Defined in Crypto.Error.Types Methods (==) :: CryptoFailable a -> CryptoFailable a -> Bool # (/=) :: CryptoFailable a -> CryptoFailable a -> Bool # | |
Eq (Digest a) | |
Eq1 f => Eq (Fix f) | |
(Functor f, Eq1 f) => Eq (Mu f) | |
(Functor f, Eq1 f) => Eq (Nu f) | |
Eq a => Eq (DNonEmpty a) | |
Eq a => Eq (DList a) | |
Eq v => Eq (LabelMap v) | |
Eq (CoAxiom br) | |
Eq (DeBruijn Coercion) | |
Eq (DeBruijn Type) | |
Eq (DeBruijn Var) | |
Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) | |
Eq (DeBruijn a) => Eq (DeBruijn [a]) | |
Eq a => Eq (FromListCounting a) | |
Eq a => Eq (Word64Map a) | |
Eq a => Eq (OnOff a) | |
Eq tag => Eq (AnnSortKey tag) | |
Defined in GHC.Parser.Annotation Methods (==) :: AnnSortKey tag -> AnnSortKey tag -> Bool # (/=) :: AnnSortKey tag -> AnnSortKey tag -> Bool # | |
Eq ann => Eq (EpAnn ann) | |
Eq (EpToken tok) | |
Eq tc => Eq (TyConFlavour tc) | |
Defined in GHC.Types.Basic Methods (==) :: TyConFlavour tc -> TyConFlavour tc -> Bool # (/=) :: TyConFlavour tc -> TyConFlavour tc -> Bool # | |
Eq a => Eq (EpaLocation' a) | |
Defined in GHC.Types.SrcLoc Methods (==) :: EpaLocation' a -> EpaLocation' a -> Bool # (/=) :: EpaLocation' a -> EpaLocation' a -> Bool # | |
Eq (GenTickish 'TickishPassCmm) | |
Defined in GHC.Types.Tickish Methods (==) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool # (/=) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool # | |
Eq (GenTickish 'TickishPassCore) | |
Defined in GHC.Types.Tickish Methods (==) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool # (/=) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool # | |
Eq (IdP pass) => Eq (WarningTxt pass) | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: WarningTxt pass -> WarningTxt pass -> Bool # (/=) :: WarningTxt pass -> WarningTxt pass -> Bool # | |
Eq (IdP pass) => Eq (Warnings pass) | |
Eq unit => Eq (Definite unit) | |
Eq (GenInstantiatedUnit unit) | |
Defined in GHC.Unit.Types Methods (==) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # (/=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # | |
Eq unit => Eq (GenModule unit) | |
IsUnitId u => Eq (GenUnit u) | |
Eq mod => Eq (GenWithIsBoot mod) | |
Defined in GHC.Unit.Types Methods (==) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # (/=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # | |
Eq a => Eq (DataDefnCons a) | |
Defined in Language.Haskell.Syntax.Decls Methods (==) :: DataDefnCons a -> DataDefnCons a -> Bool # (/=) :: DataDefnCons a -> DataDefnCons a -> Bool # | |
Eq (HsLit x) | |
Eq (XXOverLit p) => Eq (HsOverLit p) | |
(Eq (XRec pass RdrName), Eq (XCFieldOcc pass), Eq (XXFieldOcc pass)) => Eq (FieldOcc pass) | |
Eq a => Eq (NonEmpty a) | @since base-4.9.0.0 |
Eq (TVar a) | @since base-4.8.0.0 |
Eq a => Eq (Identity a) | @since base-4.8.0.0 |
Eq a => Eq (First a) | @since base-2.01 |
Eq a => Eq (Last a) | @since base-2.01 |
Eq a => Eq (Down a) | @since base-4.6.0.0 |
Eq a => Eq (Dual a) | @since base-2.01 |
Eq a => Eq (Product a) | @since base-2.01 |
Eq a => Eq (Sum a) | @since base-2.01 |
Eq (ForeignPtr a) | @since base-2.01 |
Defined in GHC.Internal.ForeignPtr | |
Eq a => Eq (ZipList a) | @since base-4.7.0.0 |
Eq p => Eq (Par1 p) | @since base-4.7.0.0 |
Eq (IORef a) | Pointer equality. @since base-4.0.0.0 |
Eq (MVar a) | Compares the underlying pointers. @since base-4.1.0.0 |
Eq (FunPtr a) | |
Eq (Ptr a) | @since base-2.01 |
Eq a => Eq (Ratio a) | @since base-2.01 |
Eq (SNat n) | @since base-4.19.0.0 |
Eq (OAuthCode s) | |
Eq (OAuthToken s) | |
Defined in Gogol.Internal.Auth | |
Eq a => Eq (Hashed a) | Uses precomputed hash to detect inequality faster |
Eq a => Eq (ListOf a) | |
Eq l => Eq (ModuleHeadAndImports l) | |
Defined in Language.Haskell.Exts.Parser Methods (==) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool # (/=) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool # | |
Eq a => Eq (NonGreedy a) | |
Eq l => Eq (PragmasAndModuleHead l) | |
Defined in Language.Haskell.Exts.Parser Methods (==) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool # (/=) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool # | |
Eq l => Eq (PragmasAndModuleName l) | |
Defined in Language.Haskell.Exts.Parser Methods (==) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool # (/=) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool # | |
Eq a => Eq (Loc a) | |
Eq l => Eq (Activation l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (Alt l) | |
Eq l => Eq (Annotation l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (Assoc l) | |
Eq l => Eq (Asst l) | |
Eq l => Eq (BangType l) | |
Eq l => Eq (Binds l) | |
Eq l => Eq (BooleanFormula l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: BooleanFormula l -> BooleanFormula l -> Bool # (/=) :: BooleanFormula l -> BooleanFormula l -> Bool # | |
Eq l => Eq (Bracket l) | |
Eq l => Eq (CName l) | |
Eq l => Eq (CallConv l) | |
Eq l => Eq (ClassDecl l) | |
Eq l => Eq (ConDecl l) | |
Eq l => Eq (Context l) | |
Eq l => Eq (DataOrNew l) | |
Eq l => Eq (Decl l) | |
Eq l => Eq (DeclHead l) | |
Eq l => Eq (DerivStrategy l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: DerivStrategy l -> DerivStrategy l -> Bool # (/=) :: DerivStrategy l -> DerivStrategy l -> Bool # | |
Eq l => Eq (Deriving l) | |
Eq l => Eq (EWildcard l) | |
Eq l => Eq (Exp l) | |
Eq l => Eq (ExportSpec l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (ExportSpecList l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: ExportSpecList l -> ExportSpecList l -> Bool # (/=) :: ExportSpecList l -> ExportSpecList l -> Bool # | |
Eq l => Eq (FieldDecl l) | |
Eq l => Eq (FieldUpdate l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: FieldUpdate l -> FieldUpdate l -> Bool # (/=) :: FieldUpdate l -> FieldUpdate l -> Bool # | |
Eq l => Eq (FunDep l) | |
Eq l => Eq (GadtDecl l) | |
Eq l => Eq (GuardedRhs l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (IPBind l) | |
Eq l => Eq (IPName l) | |
Eq l => Eq (ImportDecl l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (ImportSpec l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (ImportSpecList l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: ImportSpecList l -> ImportSpecList l -> Bool # (/=) :: ImportSpecList l -> ImportSpecList l -> Bool # | |
Eq l => Eq (InjectivityInfo l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: InjectivityInfo l -> InjectivityInfo l -> Bool # (/=) :: InjectivityInfo l -> InjectivityInfo l -> Bool # | |
Eq l => Eq (InstDecl l) | |
Eq l => Eq (InstHead l) | |
Eq l => Eq (InstRule l) | |
Eq l => Eq (Literal l) | |
Eq l => Eq (Match l) | |
Eq l => Eq (MaybePromotedName l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: MaybePromotedName l -> MaybePromotedName l -> Bool # (/=) :: MaybePromotedName l -> MaybePromotedName l -> Bool # | |
Eq l => Eq (Module l) | |
Eq l => Eq (ModuleHead l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (ModuleName l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (ModulePragma l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: ModulePragma l -> ModulePragma l -> Bool # (/=) :: ModulePragma l -> ModulePragma l -> Bool # | |
Eq l => Eq (Name l) | |
Eq l => Eq (Namespace l) | |
Eq l => Eq (Op l) | |
Eq l => Eq (Overlap l) | |
Eq l => Eq (PXAttr l) | |
Eq l => Eq (Pat l) | |
Eq l => Eq (PatField l) | |
Eq l => Eq (PatternSynDirection l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: PatternSynDirection l -> PatternSynDirection l -> Bool # (/=) :: PatternSynDirection l -> PatternSynDirection l -> Bool # | |
Eq l => Eq (Promoted l) | |
Eq l => Eq (QName l) | |
Eq l => Eq (QOp l) | |
Eq l => Eq (QualConDecl l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: QualConDecl l -> QualConDecl l -> Bool # (/=) :: QualConDecl l -> QualConDecl l -> Bool # | |
Eq l => Eq (QualStmt l) | |
Eq l => Eq (RPat l) | |
Eq l => Eq (RPatOp l) | |
Eq l => Eq (ResultSig l) | |
Eq l => Eq (Rhs l) | |
Eq l => Eq (Role l) | |
Eq l => Eq (Rule l) | |
Eq l => Eq (RuleVar l) | |
Eq l => Eq (Safety l) | |
Eq l => Eq (Sign l) | |
Eq l => Eq (SpecialCon l) | |
Defined in Language.Haskell.Exts.Syntax | |
Eq l => Eq (Splice l) | |
Eq l => Eq (Stmt l) | |
Eq l => Eq (TyVarBind l) | |
Eq l => Eq (Type l) | |
Eq l => Eq (TypeEqn l) | |
Eq l => Eq (Unpackedness l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: Unpackedness l -> Unpackedness l -> Bool # (/=) :: Unpackedness l -> Unpackedness l -> Bool # | |
Eq l => Eq (WarningText l) | |
Defined in Language.Haskell.Exts.Syntax Methods (==) :: WarningText l -> WarningText l -> Bool # (/=) :: WarningText l -> WarningText l -> Bool # | |
Eq l => Eq (XAttr l) | |
Eq l => Eq (XName l) | |
Eq a => Eq (AddrRange a) | |
Eq a => Eq (Item a) | |
Eq a => Eq (Deque a) | |
Eq e => Eq (ErrorFancy e) | |
Defined in Text.Megaparsec.Error | |
Eq t => Eq (ErrorItem t) | |
Eq s => Eq (PosState s) | |
Eq mono => Eq (NonNull mono) | |
Eq a => Eq (WithinSet a) # | |
Eq a => Eq (ColumnPolicy a) # | |
Defined in Napkin.Run.Effects.Programs Methods (==) :: ColumnPolicy a -> ColumnPolicy a -> Bool # (/=) :: ColumnPolicy a -> ColumnPolicy a -> Bool # | |
Eq (BackendTableMeta b) => Eq (CreateTableAs b) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods (==) :: CreateTableAs b -> CreateTableAs b -> Bool # (/=) :: CreateTableAs b -> CreateTableAs b -> Bool # | |
Eq a => Eq (Named a) | |
Eq a => Eq (BoolOrOpts a) | |
Defined in Napkin.Types.Postgres.Timescale | |
Eq a => Eq (ContinuousAggregatePolicy' a) | |
Defined in Napkin.Types.Postgres.Timescale Methods (==) :: ContinuousAggregatePolicy' a -> ContinuousAggregatePolicy' a -> Bool # (/=) :: ContinuousAggregatePolicy' a -> ContinuousAggregatePolicy' a -> Bool # | |
Eq a => Eq (Alias a) | |
Eq a => Eq (Selected a) | |
Eq a => Eq (WithSpecTable a) | |
Defined in Napkin.Types.Core Methods (==) :: WithSpecTable a -> WithSpecTable a -> Bool # (/=) :: WithSpecTable a -> WithSpecTable a -> Bool # | |
Eq a => Eq (ME a) | |
Eq a => Eq (Transformed a) | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: Transformed a -> Transformed a -> Bool # (/=) :: Transformed a -> Transformed a -> Bool # | |
Eq (BackendMaterializedViewMeta b) => Eq (YamlBackendMaterializedViewMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods (==) :: YamlBackendMaterializedViewMeta b -> YamlBackendMaterializedViewMeta b -> Bool # (/=) :: YamlBackendMaterializedViewMeta b -> YamlBackendMaterializedViewMeta b -> Bool # | |
Eq (BackendTableMeta b) => Eq (YamlBackendTableMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods (==) :: YamlBackendTableMeta b -> YamlBackendTableMeta b -> Bool # (/=) :: YamlBackendTableMeta b -> YamlBackendTableMeta b -> Bool # | |
Eq (BackendViewMeta b) => Eq (YamlBackendViewMeta b) | |
Defined in Napkin.Spec.Yaml.Types.BackendMeta Methods (==) :: YamlBackendViewMeta b -> YamlBackendViewMeta b -> Bool # (/=) :: YamlBackendViewMeta b -> YamlBackendViewMeta b -> Bool # | |
Eq a => Eq (Chunk a) | |
Eq a => Eq (OSet a) | |
Eq a => Eq (AnnotDetails a) | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Methods (==) :: AnnotDetails a -> AnnotDetails a -> Bool # (/=) :: AnnotDetails a -> AnnotDetails a -> Bool # | |
Eq (Doc a) | |
Eq a => Eq (Span a) | |
Eq a => Eq (CommaSeparated a) | |
Defined in Text.Pretty.Simple.Internal.Expr Methods (==) :: CommaSeparated a -> CommaSeparated a -> Bool # (/=) :: CommaSeparated a -> CommaSeparated a -> Bool # | |
Eq ann => Eq (SimpleDocStream ann) | |
Defined in Prettyprinter.Internal Methods (==) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # (/=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # | |
Eq a => Eq (Array a) | |
(Eq a, Prim a) => Eq (PrimArray a) | Since: primitive-0.6.4.0 |
Eq a => Eq (SmallArray a) | |
Defined in Data.Primitive.SmallArray | |
Eq g => Eq (StateGen g) | |
Eq g => Eq (AtomicGen g) | |
Eq g => Eq (IOGen g) | |
Eq g => Eq (STGen g) | |
Eq g => Eq (TGen g) | |
Eq a => Eq (Trie a) | |
Eq a => Eq (I a) | |
Eq (TMVar a) | |
Eq a => Eq (Maybe a) | |
Eq flag => Eq (TyVarBndr flag) | |
Eq a => Eq (Stream a) | |
Eq a => Eq (HashSet a) | Note that, in the presence of hash collisions, equal
In general, the lack of extensionality can be observed with any function that depends on the key ordering, such as folds and traversals. |
Eq (URIRef a) | |
Eq a => Eq (Vector a) | |
(Prim a, Eq a) => Eq (Vector a) | |
(Storable a, Eq a) => Eq (Vector a) | |
Eq a => Eq (Maybe a) | @since base-2.01 |
Eq a => Eq (Solo a) | |
Eq a => Eq [a] | |
(Eq k, Eq e) => Eq (TkArray k e) | |
(Eq k, Eq e) => Eq (TkRecord k e) | |
(Eq k, Eq e) => Eq (Tokens k e) | |
(Ix ix, Eq e, IArray UArray e) => Eq (UArray ix e) | |
Eq (Fixed a) | Since: base-2.1 |
Eq a => Eq (Arg a b) | Since: base-4.9.0.0 |
(Eq k, Eq a) => Eq (Map k a) | |
(Eq1 f, Eq a) => Eq (Cofree f a) | |
(Eq1 f, Eq a) => Eq (Free f a) | |
(Eq a, Ord b) => Eq (Gr a b) | |
(Eq (IdP pass), Eq a) => Eq (WithHsDocIdentifiers a pass) | |
Defined in GHC.Hs.Doc Methods (==) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool # (/=) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool # | |
(Eq l, Eq e) => Eq (GenLocated l e) | |
Defined in GHC.Types.SrcLoc Methods (==) :: GenLocated l e -> GenLocated l e -> Bool # (/=) :: GenLocated l e -> GenLocated l e -> Bool # | |
(Eq k, Eq a) => Eq (UniqMap k a) | |
(Eq a, Eq b) => Eq (Either a b) | @since base-2.01 |
Eq (Proxy s) | @since base-4.7.0.0 |
Eq (TypeRep a) | @since base-2.01 |
Eq (U1 p) | @since base-4.9.0.0 |
Eq (V1 p) | @since base-4.9.0.0 |
(Eq1 f, Eq a) => Eq (Yoneda f a) | |
(Eq i, Eq a) => Eq (Level i a) | |
(Eq (Token s), Eq e) => Eq (ParseError s e) | |
Defined in Text.Megaparsec.Error Methods (==) :: ParseError s e -> ParseError s e -> Bool # (/=) :: ParseError s e -> ParseError s e -> Bool # | |
(Eq s, Eq (Token s), Eq e) => Eq (ParseErrorBundle s e) | |
Defined in Text.Megaparsec.Error Methods (==) :: ParseErrorBundle s e -> ParseErrorBundle s e -> Bool # (/=) :: ParseErrorBundle s e -> ParseErrorBundle s e -> Bool # | |
(Eq (ParseError s e), Eq s) => Eq (State s e) | |
Eq (Ref a) | |
Eq (DumpItem b) | |
Eq (Renderable b) | |
Eq (DryRunResult b) | |
Defined in Napkin.Run.Effects.Types Methods (==) :: DryRunResult b -> DryRunResult b -> Bool # (/=) :: DryRunResult b -> DryRunResult b -> Bool # | |
Eq (BackendQueryStats bk) => Eq (QueryStats bk) | |
Defined in Napkin.Types.QueryStats Methods (==) :: QueryStats bk -> QueryStats bk -> Bool # (/=) :: QueryStats bk -> QueryStats bk -> Bool # | |
(Eq k, Eq v) => Eq (OMap k v) | |
Eq (MutableArray s a) | |
Defined in Data.Primitive.Array Methods (==) :: MutableArray s a -> MutableArray s a -> Bool # (/=) :: MutableArray s a -> MutableArray s a -> Bool # | |
Eq (MutablePrimArray s a) | |
Defined in Data.Primitive.PrimArray Methods (==) :: MutablePrimArray s a -> MutablePrimArray s a -> Bool # (/=) :: MutablePrimArray s a -> MutablePrimArray s a -> Bool # | |
Eq (SmallMutableArray s a) | |
Defined in Data.Primitive.SmallArray Methods (==) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool # (/=) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool # | |
Eq a => Eq (WithStatus k a) | |
Defined in Servant.API.UVerb Methods (==) :: WithStatus k a -> WithStatus k a -> Bool # (/=) :: WithStatus k a -> WithStatus k a -> Bool # | |
(Eq a, Eq b) => Eq (Either a b) | |
(Eq a, Eq b) => Eq (These a b) | |
(Eq a, Eq b) => Eq (Pair a b) | |
Eq a => Eq (B dst a) | |
(Eq a, Eq b) => Eq (These a b) | |
(Eq1 f, Eq a) => Eq (Lift f a) | |
(Eq1 m, Eq a) => Eq (MaybeT m a) | |
(Eq k, Eq v) => Eq (HashMap k v) | Note that, in the presence of hash collisions, equal
In general, the lack of extensionality can be observed with any function that depends on the key ordering, such as folds and traversals. |
(Eq k, Eq v) => Eq (Leaf k v) | |
(Eq a, Eq b) => Eq (a, b) | |
Eq (STUArray s i e) | |
Eq (p (Fix p a) a) => Eq (Fix p a) | |
Eq (p a a) => Eq (Join p a) | |
(Eq a, Eq (f b)) => Eq (CofreeF f a b) | |
Eq (w (CofreeF f a (CofreeT f w a))) => Eq (CofreeT f w a) | |
(Eq a, Eq (f b)) => Eq (FreeF f a b) | |
(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) | |
Eq a => Eq (Const a b) | @since base-4.9.0.0 |
Eq (f a) => Eq (Ap f a) | @since base-4.12.0.0 |
Eq (f a) => Eq (Alt f a) | @since base-4.8.0.0 |
Eq (a :~: b) | @since base-4.7.0.0 |
Eq (OrderingI a b) | |
(Generic1 f, Eq (Rep1 f a)) => Eq (Generically1 f a) | @since base-4.18.0.0 |
Defined in GHC.Internal.Generics Methods (==) :: Generically1 f a -> Generically1 f a -> Bool # (/=) :: Generically1 f a -> Generically1 f a -> Bool # | |
Eq (f p) => Eq (Rec1 f p) | @since base-4.7.0.0 |
Eq (URec (Ptr ()) p) | @since base-4.9.0.0 |
Eq (URec Char p) | @since base-4.9.0.0 |
Eq (URec Double p) | @since base-4.9.0.0 |
Eq (URec Float p) | |
Eq (URec Int p) | @since base-4.9.0.0 |
Eq (URec Word p) | @since base-4.9.0.0 |
Eq (Assertion a b) | |
Eq (External m a) | |
Eq (LoadQuery m a) | |
Eq (SqlParse m a) | |
Eq (SqlRender m a) | |
Eq a => Eq (K a b) | |
All (Compose Eq f) xs => Eq (NP f xs) | |
Eq (NP (NP f) xss) => Eq (POP f xss) | |
All (Compose Eq f) xs => Eq (NS f xs) | |
Eq (NS (NP f) xss) => Eq (SOP f xss) | |
Eq b => Eq (Tagged s b) | |
(Eq (f a), Eq (g a), Eq a) => Eq (These1 f g a) | |
(Eq1 f, Eq a) => Eq (Backwards f a) | |
(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) | |
(Eq1 f, Eq a) => Eq (IdentityT f a) | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) | |
Eq a => Eq (Constant a b) | |
(Eq1 f, Eq a) => Eq (Reverse f a) | |
(Eq a, Eq b, Eq c) => Eq (a, b, c) | |
(Eq (f a), Eq (g a)) => Eq (Product f g a) | Since: base-4.18.0.0 |
(Eq (f a), Eq (g a)) => Eq (Sum f g a) | Since: base-4.18.0.0 |
Eq (a :~~: b) | @since base-4.10.0.0 |
(Eq (f p), Eq (g p)) => Eq ((f :*: g) p) | @since base-4.7.0.0 |
(Eq (f p), Eq (g p)) => Eq ((f :+: g) p) | @since base-4.7.0.0 |
Eq c => Eq (K1 i c p) | @since base-4.7.0.0 |
(Eq (BackendMaterializedViewMeta bk), Eq (BackendTableMeta bk), Eq (BackendViewMeta bk)) => Eq (SqlWrite bk a b) | |
(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) | |
Eq (f (g a)) => Eq (Compose f g a) | Since: base-4.18.0.0 |
Eq (f a) => Eq (Clown f a b) | |
Eq (p b a) => Eq (Flip p a b) | |
Eq (g b) => Eq (Joker g a b) | |
Eq (p a b) => Eq (WrappedBifunctor p a b) | |
Defined in Data.Bifunctor.Wrapped Methods (==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool # (/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool # | |
Eq (f (g p)) => Eq ((f :.: g) p) | @since base-4.7.0.0 |
Eq (f p) => Eq (M1 i c f p) | @since base-4.7.0.0 |
Eq (AnnotateRead bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateRead Methods (==) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool # (/=) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool # | |
Eq (AnnotateWrite bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateWrite Methods (==) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool # (/=) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool # | |
Eq (SqlRead b m a) | |
(Eq1 f, Eq1 g, Eq a) => Eq ((f :.: g) a) | |
(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) | |
(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) | |
(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) | |
Eq (f (p a b)) => Eq (Tannen f p a b) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) | |
Eq (p (f a) (g b)) => Eq (Biff p f g a b) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
String
is an alias for a list of characters.
String constants in Haskell are values of type String
.
That means if you write a string literal like "hello world"
,
it will have the type [Char]
, which is the same as String
.
Note: You can ask the compiler to automatically infer different types
with the -XOverloadedStrings
language extension, for example
"hello world" :: Text
. See IsString
for more information.
Because String
is just a list of characters, you can use normal list functions
to do basic string manipulation. See Data.List for operations on lists.
Performance considerations
[Char]
is a relatively memory-inefficient type.
It is a linked list of boxed word-size characters, internally it looks something like:
╭─────┬───┬──╮ ╭─────┬───┬──╮ ╭─────┬───┬──╮ ╭────╮ │ (:) │ │ ─┼─>│ (:) │ │ ─┼─>│ (:) │ │ ─┼─>│ [] │ ╰─────┴─┼─┴──╯ ╰─────┴─┼─┴──╯ ╰─────┴─┼─┴──╯ ╰────╯ v v v 'a' 'b' 'c'
The String
"abc" will use 5*3+1 = 16
(in general 5n+1
)
words of space in memory.
Furthermore, operations like (++)
(string concatenation) are O(n)
(in the left argument).
For historical reasons, the base
library uses String
in a lot of places
for the conceptual simplicity, but library code dealing with user-data
should use the text
package for Unicode text, or the the
bytestring package
for binary data.
The Maybe
type encapsulates an optional value. A value of type
either contains a value of type Maybe
aa
(represented as
),
or it is empty (represented as Just
aNothing
). Using Maybe
is a good way to
deal with errors or exceptional cases without resorting to drastic
measures such as error
.
The Maybe
type is also a monad. It is a simple kind of error
monad, where all errors are represented by Nothing
. A richer
error monad can be built using the Either
type.
Instances
FromJSON1 Maybe | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON1 Maybe | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Maybe a -> Value # liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value # liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding # liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding # liftOmitField :: (a -> Bool) -> Maybe a -> Bool # | |||||
MonadZip Maybe | Since: base-4.8.0.0 | ||||
Eq1 Maybe | Since: base-4.9.0.0 | ||||
Ord1 Maybe | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read1 Maybe | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 Maybe | Since: base-4.9.0.0 | ||||
MonadFailure Maybe | |||||
NFData1 Maybe | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
MonadThrow Maybe | |||||
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e) => e -> Maybe a # | |||||
Alternative Maybe | Picks the leftmost @since base-2.01 | ||||
Applicative Maybe | @since base-2.01 | ||||
Functor Maybe | @since base-2.01 | ||||
Monad Maybe | @since base-2.01 | ||||
MonadPlus Maybe | Picks the leftmost @since base-2.01 | ||||
MonadFail Maybe | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Control.Monad.Fail | |||||
Foldable Maybe | @since base-2.01 | ||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => Maybe m -> m # foldMap :: Monoid m => (a -> m) -> Maybe a -> m # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m # foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b # foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |||||
Traversable Maybe | @since base-2.01 | ||||
Hashable1 Maybe | |||||
Defined in Data.Hashable.Class | |||||
Generic1 Maybe | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
FoldableWithIndex () Maybe | |||||
FunctorWithIndex () Maybe | |||||
TraversableWithIndex () Maybe | |||||
MonadBaseControl Maybe Maybe | |||||
MonadError () Maybe | Since: mtl-2.2.2 | ||||
Defined in Control.Monad.Error.Class | |||||
(Selector s, FromHttpApiData c) => GFromForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) | |||||
(Selector s, ToHttpApiData c) => GToForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) | |||||
OutputableP env a => OutputableP env (Maybe a) | |||||
Defined in GHC.Utils.Outputable | |||||
Lift a => Lift (Maybe a :: Type) | |||||
FromJSON a => FromJSON (Maybe a) | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON a => ToJSON (Maybe a) | |||||
Default (Maybe a) | |||||
Defined in Data.Default.Class | |||||
NFData a => NFData (Maybe a) | |||||
Defined in Control.DeepSeq | |||||
Buildable' a => Buildable' (Maybe a) | |||||
Defined in Fmt.Internal.Generic | |||||
Buildable a => Buildable (Maybe a) | |||||
Defined in Formatting.Buildable | |||||
ToHie a => ToHie (Maybe a) | |||||
Defined in GHC.Iface.Ext.Ast | |||||
HasLoc a => HasLoc (Maybe a) | |||||
Defined in GHC.Parser.Annotation | |||||
NoAnn (Maybe a) | |||||
Defined in GHC.Parser.Annotation | |||||
Outputable a => Outputable (Maybe a) | |||||
Defined in GHC.Utils.Outputable | |||||
Semigroup a => Monoid (Maybe a) | Lift a semigroup into Since 4.11.0: constraint on inner @since base-2.01 | ||||
Semigroup a => Semigroup (Maybe a) | @since base-4.9.0.0 | ||||
Data a => Data (Maybe a) | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) # toConstr :: Maybe a -> Constr # dataTypeOf :: Maybe a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) # gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # | |||||
Generic (Maybe a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
SingKind a => SingKind (Maybe a) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Read a => Read (Maybe a) | @since base-2.01 | ||||
Show a => Show (Maybe a) | @since base-2.01 | ||||
Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) | |||||
Eq a => Eq (Maybe a) | @since base-2.01 | ||||
Ord a => Ord (Maybe a) | @since base-2.01 | ||||
Hashable a => Hashable (Maybe a) | |||||
Defined in Data.Hashable.Class | |||||
At (Maybe a) | |||||
Ixed (Maybe a) | |||||
Defined in Control.Lens.At | |||||
AsEmpty (Maybe a) | |||||
Defined in Control.Lens.Empty | |||||
HasTypeVars t => HasTypeVars (Maybe t) | |||||
Defined in Language.Haskell.TH.Lens Methods typeVarsEx :: Set Name -> Traversal' (Maybe t) Name # | |||||
MonoFoldable (Maybe a) | |||||
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m # ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b # ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0 # otoList :: Maybe a -> [Element (Maybe a)] # oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool # oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool # olength64 :: Maybe a -> Int64 # ocompareLength :: Integral i => Maybe a -> i -> Ordering # otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f () # ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f () # omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m () # oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m () # ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0 # ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m # ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) # ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) # headEx :: Maybe a -> Element (Maybe a) # lastEx :: Maybe a -> Element (Maybe a) # unsafeHead :: Maybe a -> Element (Maybe a) # unsafeLast :: Maybe a -> Element (Maybe a) # maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) # minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) # | |||||
MonoFunctor (Maybe a) | |||||
MonoPointed (Maybe a) | |||||
MonoTraversable (Maybe a) | |||||
Val a => Val (Maybe a) | |||||
HasDeps a => HasDeps (Maybe a) | |||||
Defined in Napkin.Types.Deps | |||||
CombiBomb a => CombiBomb (Maybe a) | |||||
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods toParensOperatorArgs :: Maybe a -> [ParensOperatorArgument] # | |||||
ToSql a => ToSql (Maybe a) | |||||
Defined in Database.ODBC.SQLServer | |||||
Pretty a => Pretty (Maybe a) | Ignore
| ||||
Defined in Prettyprinter.Internal | |||||
SingI ('Nothing :: Maybe a) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
Each (Maybe a) (Maybe b) a b |
| ||||
Each (Maybe a) (Maybe b) a b | |||||
SingI a2 => SingI ('Just a2 :: Maybe a1) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type Failure Maybe | |||||
Defined in Basement.Monad | |||||
type Rep1 Maybe | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type StM Maybe a | |||||
Defined in Control.Monad.Trans.Control | |||||
type Eval (FoldMap f ('Just x) :: a2 -> Type) | |||||
type Eval (FoldMap f ('Nothing :: Maybe a1) :: a2 -> Type) | |||||
type Eval (Foldr f y ('Just x) :: a2 -> Type) | |||||
type Eval (Foldr f y ('Nothing :: Maybe a1) :: a2 -> Type) | |||||
type MEmpty | |||||
Defined in Fcf.Class.Monoid | |||||
type Anno (Maybe Role) | |||||
Defined in GHC.Hs.Decls | |||||
type Anno (Maybe Role) | |||||
Defined in GHC.Hs.Decls | |||||
type DemoteRep (Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (Maybe a) | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
data Sing (b :: Maybe a) | |||||
type Index (Maybe a) | |||||
Defined in Control.Lens.At | |||||
type IxValue (Maybe a) | |||||
Defined in Control.Lens.At | |||||
type Element (Maybe a) | |||||
Defined in Data.MonoTraversable | |||||
type (a2 :: Maybe a1) <> ('Nothing :: Maybe a1) | |||||
Defined in Fcf.Class.Monoid | |||||
type ('Nothing :: Maybe a) <> (b :: Maybe a) | |||||
Defined in Fcf.Class.Monoid | |||||
type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) | |||||
type Eval (Tail (_a ': as) :: Maybe [a] -> Type) | |||||
type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) | |||||
type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) | |||||
type Eval (Init '[a2] :: Maybe [a1] -> Type) | |||||
type Eval (Head ('[] :: [a]) :: Maybe a -> Type) | |||||
type Eval (Last ('[] :: [a]) :: Maybe a -> Type) | |||||
type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) | |||||
type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) | |||||
type Eval (Last '[a2] :: Maybe a1 -> Type) | |||||
type ('Just a2 :: Maybe a1) <> ('Just b :: Maybe a1) | |||||
type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) | |||||
type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) | |||||
type Eval (NumIter a s :: Maybe (k, Nat) -> Type) | |||||
type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) | |||||
type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) | |||||
type Eval (Lookup a as :: Maybe b -> Type) | |||||
type Eval (Map f ('Just a3) :: Maybe a2 -> Type) | |||||
type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) | |||||
type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) | |||||
Defined in Data.Generics.Product.Internal.Fields | |||||
type Eval (HasTotalPositionPSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) | |||||
Defined in Data.Generics.Product.Internal.Positions | |||||
type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) | |||||
Defined in Data.Generics.Product.Internal.Subtype | |||||
type Eval (HasTotalTypePSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) | |||||
Defined in Data.Generics.Product.Internal.Typed |
Instances
FromJSON Bool | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Bool | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Bool | |||||
ToJSONKey Bool | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
BitOps Bool | |||||
FiniteBitsOps Bool | |||||
NFData Bool | |||||
Defined in Control.DeepSeq | |||||
Buildable Bool | |||||
Defined in Formatting.Buildable | |||||
ToJExpr Bool | |||||
Defined in GHC.JS.Make | |||||
NoAnn Bool | |||||
Defined in GHC.Parser.Annotation | |||||
Outputable Bool | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Bool | Interpret @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Bits Methods (.&.) :: Bool -> Bool -> Bool # (.|.) :: Bool -> Bool -> Bool # complement :: Bool -> Bool # shift :: Bool -> Int -> Bool # rotate :: Bool -> Int -> Bool # setBit :: Bool -> Int -> Bool # clearBit :: Bool -> Int -> Bool # complementBit :: Bool -> Int -> Bool # testBit :: Bool -> Int -> Bool # bitSizeMaybe :: Bool -> Maybe Int # shiftL :: Bool -> Int -> Bool # unsafeShiftL :: Bool -> Int -> Bool # shiftR :: Bool -> Int -> Bool # unsafeShiftR :: Bool -> Int -> Bool # rotateL :: Bool -> Int -> Bool # | |||||
FiniteBits Bool | @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Bits Methods finiteBitSize :: Bool -> Int # countLeadingZeros :: Bool -> Int # countTrailingZeros :: Bool -> Int # | |||||
Data Bool | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool # dataTypeOf :: Bool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) # gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # | |||||
Bounded Bool | @since base-2.01 | ||||
Enum Bool | @since base-2.01 | ||||
Generic Bool | |||||
Defined in GHC.Internal.Generics | |||||
SingKind Bool | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Read Bool | @since base-2.01 | ||||
Show Bool | @since base-2.01 | ||||
Eq Bool | |||||
Ord Bool | |||||
Hashable Bool | |||||
Defined in Data.Hashable.Class | |||||
HpcHash Bool | |||||
Defined in Trace.Hpc.Util | |||||
FromFormKey Bool | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Bool | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Val Bool | |||||
ToSql Bool | Corresponds to BIT type of SQL Server. | ||||
Defined in Database.ODBC.SQLServer | |||||
Pretty Bool |
| ||||
Defined in Prettyprinter.Internal | |||||
Uniform Bool | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Bool # | |||||
UniformRange Bool | |||||
Defined in System.Random.Internal | |||||
Unbox Bool | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Bool | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Bool -> (i, i) # numElements :: Ix i => UArray i Bool -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Bool)] -> UArray i Bool # unsafeAt :: Ix i => UArray i Bool -> Int -> Bool # unsafeReplace :: Ix i => UArray i Bool -> [(Int, Bool)] -> UArray i Bool # unsafeAccum :: Ix i => (Bool -> e' -> Bool) -> UArray i Bool -> [(Int, e')] -> UArray i Bool # unsafeAccumArray :: Ix i => (Bool -> e' -> Bool) -> Bool -> (i, i) -> [(Int, e')] -> UArray i Bool # | |||||
SingI 'False | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
SingI 'True | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
Lift Bool | |||||
Vector Vector Bool | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Bool -> ST s (Vector Bool) # basicUnsafeThaw :: Vector Bool -> ST s (Mutable Vector s Bool) # basicLength :: Vector Bool -> Int # basicUnsafeSlice :: Int -> Int -> Vector Bool -> Vector Bool # basicUnsafeIndexM :: Vector Bool -> Int -> Box Bool # basicUnsafeCopy :: Mutable Vector s Bool -> Vector Bool -> ST s () # | |||||
MVector MVector Bool | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Bool -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Bool -> MVector s Bool # basicOverlaps :: MVector s Bool -> MVector s Bool -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Bool) # basicInitialize :: MVector s Bool -> ST s () # basicUnsafeReplicate :: Int -> Bool -> ST s (MVector s Bool) # basicUnsafeRead :: MVector s Bool -> Int -> ST s Bool # basicUnsafeWrite :: MVector s Bool -> Int -> Bool -> ST s () # basicClear :: MVector s Bool -> ST s () # basicSet :: MVector s Bool -> Bool -> ST s () # basicUnsafeCopy :: MVector s Bool -> MVector s Bool -> ST s () # basicUnsafeMove :: MVector s Bool -> MVector s Bool -> ST s () # basicUnsafeGrow :: MVector s Bool -> Int -> ST s (MVector s Bool) # | |||||
MArray (STUArray s) Bool (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Bool -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Bool -> ST s Int # newArray :: Ix i => (i, i) -> Bool -> ST s (STUArray s i Bool) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) # unsafeRead :: Ix i => STUArray s i Bool -> Int -> ST s Bool # unsafeWrite :: Ix i => STUArray s i Bool -> Int -> Bool -> ST s () # | |||||
type Anno Bool | |||||
Defined in GHC.Hs.Decls | |||||
type DemoteRep Bool | |||||
Defined in GHC.Internal.Generics | |||||
type Rep Bool | @since base-4.6.0.0 | ||||
data Sing (a :: Bool) | |||||
newtype Vector Bool | |||||
newtype MVector s Bool | |||||
type Eval (Not 'False) | |||||
Defined in Fcf.Data.Bool | |||||
type Eval (Not 'True) | |||||
Defined in Fcf.Data.Bool | |||||
type Eval (And lst :: Bool -> Type) | |||||
type Eval (Or lst :: Bool -> Type) | |||||
type Eval ('False && b :: Bool -> Type) | |||||
type Eval ('True && b :: Bool -> Type) | |||||
type Eval (a && 'False :: Bool -> Type) | |||||
type Eval (a && 'True :: Bool -> Type) | |||||
type Eval ('False || b :: Bool -> Type) | |||||
type Eval ('True || b :: Bool -> Type) | |||||
type Eval (a || 'False :: Bool -> Type) | |||||
type Eval (a || 'True :: Bool -> Type) | |||||
type Eval (IsJust ('Just _a) :: Bool -> Type) | |||||
type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) | |||||
type Eval (IsNothing ('Just _a) :: Bool -> Type) | |||||
type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) | |||||
type Eval (Null ('[] :: [a]) :: Bool -> Type) | |||||
type Eval (Null (a2 ': as) :: Bool -> Type) | |||||
type Eval (a < b :: Bool -> Type) | |||||
type Eval (a <= b :: Bool -> Type) | |||||
type Eval (a > b :: Bool -> Type) | |||||
type Eval (a >= b :: Bool -> Type) | |||||
type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) | |||||
type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) | |||||
type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) | |||||
type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) | |||||
type Eval (Elem a2 as :: Bool -> Type) | |||||
type Eval (IsInfixOf xs ys :: Bool -> Type) | |||||
type Eval (IsPrefixOf xs ys :: Bool -> Type) | |||||
Defined in Fcf.Data.List | |||||
type Eval (IsSuffixOf xs ys :: Bool -> Type) | |||||
Defined in Fcf.Data.List | |||||
type Eval (All p lst :: Bool -> Type) | |||||
type Eval (Any p lst :: Bool -> Type) | |||||
type Eval (TyEq a b :: Bool -> Type) | |||||
The character type Char
represents Unicode codespace
and its elements are code points as in definitions
D9 and D10 of the Unicode Standard.
Character literals in Haskell are single-quoted: 'Q'
, 'Я'
or 'Ω'
.
To represent a single quote itself use '\''
, and to represent a backslash
use '\\'
. The full grammar can be found in the section 2.6 of the
Haskell 2010 Language Report.
To specify a character by its code point one can use decimal, hexadecimal
or octal notation: '\65'
, '\x41'
and '\o101'
are all alternative forms
of 'A'
. The largest code point is '\x10ffff'
.
There is a special escape syntax for ASCII control characters:
Escape | Alternatives | Meaning |
---|---|---|
'\NUL' | '\0' | null character |
'\SOH' | '\1' | start of heading |
'\STX' | '\2' | start of text |
'\ETX' | '\3' | end of text |
'\EOT' | '\4' | end of transmission |
'\ENQ' | '\5' | enquiry |
'\ACK' | '\6' | acknowledge |
'\BEL' | '\7' , '\a' | bell (alert) |
'\BS' | '\8' , '\b' | backspace |
'\HT' | '\9' , '\t' | horizontal tab |
'\LF' | '\10' , '\n' | line feed (new line) |
'\VT' | '\11' , '\v' | vertical tab |
'\FF' | '\12' , '\f' | form feed |
'\CR' | '\13' , '\r' | carriage return |
'\SO' | '\14' | shift out |
'\SI' | '\15' | shift in |
'\DLE' | '\16' | data link escape |
'\DC1' | '\17' | device control 1 |
'\DC2' | '\18' | device control 2 |
'\DC3' | '\19' | device control 3 |
'\DC4' | '\20' | device control 4 |
'\NAK' | '\21' | negative acknowledge |
'\SYN' | '\22' | synchronous idle |
'\ETB' | '\23' | end of transmission block |
'\CAN' | '\24' | cancel |
'\EM' | '\25' | end of medium |
'\SUB' | '\26' | substitute |
'\ESC' | '\27' | escape |
'\FS' | '\28' | file separator |
'\GS' | '\29' | group separator |
'\RS' | '\30' | record separator |
'\US' | '\31' | unit separator |
'\SP' | '\32' , ' ' | space |
'\DEL' | '\127' | delete |
Instances
FromJSON Char | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Char | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Char | |||||
ToJSONKey Char | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
IsChar Char | Since: base-2.1 | ||||
PrintfArg Char | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Subtractive Char | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Char | |||||
Defined in Basement.PrimType | |||||
PrimType Char | |||||
Defined in Basement.PrimType Associated Types
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 () # | |||||
NFData Char | |||||
Defined in Control.DeepSeq | |||||
Buildable Char | |||||
Defined in Formatting.Buildable | |||||
ToJExpr Char | |||||
Defined in GHC.JS.Make | |||||
Data Char | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.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 # | |||||
Bounded Char | @since base-2.01 | ||||
Enum Char | @since base-2.01 | ||||
Read Char | @since base-2.01 | ||||
Show Char | @since base-2.01 | ||||
Eq Char | |||||
Ord Char | |||||
Hashable Char | |||||
Defined in Data.Hashable.Class | |||||
HpcHash Char | |||||
Defined in Trace.Hpc.Util | |||||
FromFormKey String | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
FromFormKey Char | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey String | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Char | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
IsText String | |||||
AsJSON String | |||||
AsNumber String | |||||
AsValue String | |||||
IsKey String | |||||
TraversableStream String | |||||
VisualStream String | |||||
IsRef String | |||||
Defined in Napkin.Types.Core | |||||
Val String | |||||
Pretty Char | Instead of
| ||||
Defined in Prettyprinter.Internal | |||||
Uniform Char | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Char # | |||||
UniformRange Char | |||||
Defined in System.Random.Internal | |||||
ToLText String | |||||
Defined in Relude.String.Conversion | |||||
ToString String | |||||
Defined in Relude.String.Conversion | |||||
ToText String | |||||
Defined in Relude.String.Conversion | |||||
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 # | |||||
ConvertUtf8 String ByteString | |||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: String -> ByteString # decodeUtf8 :: ByteString -> String # decodeUtf8Strict :: ByteString -> Either UnicodeException String # | |||||
ConvertUtf8 String ShortByteString | Since: relude-0.6.0.0 | ||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: String -> ShortByteString # decodeUtf8 :: ShortByteString -> String # decodeUtf8Strict :: ShortByteString -> Either UnicodeException String # | |||||
ConvertUtf8 String LByteString | Converting | ||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: String -> LByteString # decodeUtf8 :: LByteString -> String # decodeUtf8Strict :: LByteString -> Either UnicodeException String # | |||||
StringConv ByteString String | |||||
Defined in Data.String.Conv Methods strConv :: Leniency -> ByteString -> String # | |||||
StringConv ByteString String | |||||
Defined in Data.String.Conv Methods strConv :: Leniency -> ByteString -> String # | |||||
StringConv Text String | |||||
StringConv Text String | |||||
StringConv String ByteString | |||||
Defined in Data.String.Conv Methods strConv :: Leniency -> String -> ByteString # | |||||
StringConv String ByteString | |||||
Defined in Data.String.Conv Methods strConv :: Leniency -> String -> ByteString # | |||||
StringConv String Text | |||||
StringConv String Text | |||||
StringConv String String | |||||
Lift Char | |||||
Vector Vector Char | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Char -> ST s (Vector Char) # basicUnsafeThaw :: Vector Char -> ST s (Mutable Vector s Char) # basicLength :: Vector Char -> Int # basicUnsafeSlice :: Int -> Int -> Vector Char -> Vector Char # basicUnsafeIndexM :: Vector Char -> Int -> Box Char # basicUnsafeCopy :: Mutable Vector s Char -> Vector Char -> ST s () # | |||||
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 :: Int -> ST s (MVector s Char) # basicInitialize :: MVector s Char -> ST s () # basicUnsafeReplicate :: Int -> Char -> ST s (MVector s Char) # basicUnsafeRead :: MVector s Char -> Int -> ST s Char # basicUnsafeWrite :: MVector s Char -> Int -> Char -> ST s () # basicClear :: MVector s Char -> ST s () # basicSet :: MVector s Char -> Char -> ST s () # basicUnsafeCopy :: MVector s Char -> MVector s Char -> ST s () # basicUnsafeMove :: MVector s Char -> MVector s Char -> ST s () # basicUnsafeGrow :: MVector s Char -> Int -> ST s (MVector s Char) # | |||||
KnownSymbol n => Reifies (n :: Symbol) String | |||||
Defined in Data.Reflection | |||||
MimeRender PlainText String | BC.pack | ||||
Defined in Servant.API.ContentTypes Methods mimeRender :: Proxy PlainText -> String -> ByteString # | |||||
MimeUnrender PlainText String | Right . BC.unpack | ||||
Defined in Servant.API.ContentTypes Methods mimeUnrender :: Proxy PlainText -> ByteString -> Either String String # mimeUnrenderWithType :: Proxy PlainText -> MediaType -> ByteString -> Either String String # | |||||
Cons Text Text Char Char | |||||
Cons Text Text Char Char | |||||
Snoc Text Text Char Char | |||||
Snoc Text Text Char Char | |||||
Selector s => GFromForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||
Selector s => GToForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||
Generic1 (URec Char :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Buildable' [Char] | |||||
Defined in Fmt.Internal.Generic | |||||
Buildable [Char] | |||||
Defined in Formatting.Buildable | |||||
Foldable (UChar :: Type -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.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 # elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |||||
Traversable (UChar :: Type -> Type) | @since base-4.9.0.0 | ||||
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 () # | |||||
ToJExpr a => ToJExpr (Map String a) | |||||
Functor (URec Char :: Type -> Type) | @since base-4.9.0.0 | ||||
Generic (URec Char p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Char p) | @since base-4.9.0.0 | ||||
Eq (URec Char p) | @since base-4.9.0.0 | ||||
Ord (URec Char p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type NatNumMaxBound Char | |||||
Defined in Basement.Nat | |||||
type Difference Char | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Char | |||||
Defined in Basement.PrimType | |||||
newtype Vector Char | |||||
data URec Char (p :: k) | Used for marking occurrences of @since base-4.9.0.0 | ||||
newtype MVector s Char | |||||
type Compare (a :: Char) (b :: Char) | |||||
Defined in GHC.Internal.Data.Type.Ord | |||||
type Rep1 (URec Char :: k -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Char p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics |
Double-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE double-precision type.
Instances
FromJSON Double | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Double | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Double | |||||
ToJSONKey Double | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Double | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Subtractive Double | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimType Double | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Double -> CountOf Word8 # primShiftToBytes :: Proxy Double -> Int # primBaUIndex :: ByteArray# -> Offset Double -> Double # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> prim Double # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> Double -> prim () # primAddrIndex :: Addr# -> Offset Double -> Double # primAddrRead :: PrimMonad prim => Addr# -> Offset Double -> prim Double # primAddrWrite :: PrimMonad prim => Addr# -> Offset Double -> Double -> prim () # | |||||
Default Double | |||||
Defined in Data.Default.Class | |||||
NFData Double | |||||
Defined in Control.DeepSeq | |||||
Buildable Double | |||||
Defined in Formatting.Buildable | |||||
ToJExpr Double | |||||
Defined in GHC.JS.Make | |||||
Outputable Double | |||||
Defined in GHC.Utils.Outputable | |||||
Data Double | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double # toConstr :: Double -> Constr # dataTypeOf :: Double -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) # gmapT :: (forall b. Data b => b -> b) -> Double -> Double # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # | |||||
Floating Double | @since base-2.01 | ||||
RealFloat Double | @since base-2.01 | ||||
Defined in GHC.Internal.Float Methods floatRadix :: Double -> Integer # floatDigits :: Double -> Int # floatRange :: Double -> (Int, Int) # decodeFloat :: Double -> (Integer, Int) # encodeFloat :: Integer -> Int -> Double # significand :: Double -> Double # scaleFloat :: Int -> Double -> Double # isInfinite :: Double -> Bool # isDenormalized :: Double -> Bool # isNegativeZero :: Double -> Bool # | |||||
Read Double | @since base-2.01 | ||||
Eq Double | Note that due to the presence of
Also note that
| ||||
Ord Double | IEEE 754 IEEE 754-2008, section 5.11 requires that if at least one of arguments of
IEEE 754-2008, section 5.10 defines Thus, users must be extremely cautious when using Moving further, the behaviour of IEEE 754-2008 compliant | ||||
Hashable Double | Note: prior to The Since: hashable-1.3.0.0 | ||||
Defined in Data.Hashable.Class | |||||
FromFormKey Double | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Double | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Val Double | |||||
ToSql Double | Corresponds to FLOAT type of SQL Server. | ||||
Defined in Database.ODBC.SQLServer | |||||
Pretty Double |
| ||||
Defined in Prettyprinter.Internal | |||||
UniformRange Double | |||||
Defined in System.Random.Internal | |||||
Unbox Double | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Double | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Double -> (i, i) # numElements :: Ix i => UArray i Double -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Double)] -> UArray i Double # unsafeAt :: Ix i => UArray i Double -> Int -> Double # unsafeReplace :: Ix i => UArray i Double -> [(Int, Double)] -> UArray i Double # unsafeAccum :: Ix i => (Double -> e' -> Double) -> UArray i Double -> [(Int, e')] -> UArray i Double # unsafeAccumArray :: Ix i => (Double -> e' -> Double) -> Double -> (i, i) -> [(Int, e')] -> UArray i Double # | |||||
Lift Double | |||||
Vector Vector Double | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Double -> ST s (Vector Double) # basicUnsafeThaw :: Vector Double -> ST s (Mutable Vector s Double) # basicLength :: Vector Double -> Int # basicUnsafeSlice :: Int -> Int -> Vector Double -> Vector Double # basicUnsafeIndexM :: Vector Double -> Int -> Box Double # basicUnsafeCopy :: Mutable Vector s Double -> Vector Double -> ST s () # | |||||
MVector MVector Double | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Double -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Double -> MVector s Double # basicOverlaps :: MVector s Double -> MVector s Double -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Double) # basicInitialize :: MVector s Double -> ST s () # basicUnsafeReplicate :: Int -> Double -> ST s (MVector s Double) # basicUnsafeRead :: MVector s Double -> Int -> ST s Double # basicUnsafeWrite :: MVector s Double -> Int -> Double -> ST s () # basicClear :: MVector s Double -> ST s () # basicSet :: MVector s Double -> Double -> ST s () # basicUnsafeCopy :: MVector s Double -> MVector s Double -> ST s () # basicUnsafeMove :: MVector s Double -> MVector s Double -> ST s () # basicUnsafeGrow :: MVector s Double -> Int -> ST s (MVector s Double) # | |||||
Generic1 (URec Double :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UDouble :: Type -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UDouble m -> m # foldMap :: Monoid m => (a -> m) -> UDouble a -> m # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m # foldr :: (a -> b -> b) -> b -> UDouble a -> b # foldr' :: (a -> b -> b) -> b -> UDouble a -> b # foldl :: (b -> a -> b) -> b -> UDouble a -> b # foldl' :: (b -> a -> b) -> b -> UDouble a -> b # foldr1 :: (a -> a -> a) -> UDouble a -> a # foldl1 :: (a -> a -> a) -> UDouble a -> a # elem :: Eq a => a -> UDouble a -> Bool # maximum :: Ord a => UDouble a -> a # minimum :: Ord a => UDouble a -> a # | |||||
Traversable (UDouble :: Type -> Type) | @since base-4.9.0.0 | ||||
MArray (STUArray s) Double (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Double -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Double -> ST s Int # newArray :: Ix i => (i, i) -> Double -> ST s (STUArray s i Double) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) # unsafeRead :: Ix i => STUArray s i Double -> Int -> ST s Double # unsafeWrite :: Ix i => STUArray s i Double -> Int -> Double -> ST s () # | |||||
Functor (URec Double :: Type -> Type) | @since base-4.9.0.0 | ||||
Generic (URec Double p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Double p) | @since base-4.9.0.0 | ||||
Eq (URec Double p) | @since base-4.9.0.0 | ||||
Ord (URec Double p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics Methods compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |||||
type Difference Double | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Double | |||||
Defined in Basement.PrimType | |||||
type ForeignFloating Double | |||||
Defined in Data.Double.Conversion.Internal.FFI | |||||
newtype Vector Double | |||||
data URec Double (p :: k) | Used for marking occurrences of @since base-4.9.0.0 | ||||
newtype MVector s Double | |||||
type Rep1 (URec Double :: k -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Double p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics |
A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]
.
The exact range for a given implementation can be determined by using
minBound
and maxBound
from the Bounded
class.
Instances
FromJSON Int | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
FromJSONKey Int | |||||
Defined in Data.Aeson.Types.FromJSON | |||||
ToJSON Int | |||||
ToJSONKey Int | |||||
Defined in Data.Aeson.Types.ToJSON | |||||
PrintfArg Int | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Subtractive Int | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Int | |||||
Defined in Basement.PrimType | |||||
PrimType Int | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Int -> CountOf Word8 # primShiftToBytes :: Proxy Int -> Int # primBaUIndex :: ByteArray# -> Offset Int -> Int # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> prim Int # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> Int -> prim () # primAddrIndex :: Addr# -> Offset Int -> Int # primAddrRead :: PrimMonad prim => Addr# -> Offset Int -> prim Int # primAddrWrite :: PrimMonad prim => Addr# -> Offset Int -> Int -> prim () # | |||||
Default Int | |||||
Defined in Data.Default.Class | |||||
NFData Int | |||||
Defined in Control.DeepSeq | |||||
Buildable Int | |||||
Defined in Formatting.Buildable | |||||
ToJExpr Int | |||||
Defined in GHC.JS.Make | |||||
Outputable Int | |||||
Defined in GHC.Utils.Outputable | |||||
Bits Int | @since base-2.01 | ||||
Defined in GHC.Internal.Bits | |||||
FiniteBits Int | @since base-4.6.0.0 | ||||
Defined in GHC.Internal.Bits Methods finiteBitSize :: Int -> Int # countLeadingZeros :: Int -> Int # countTrailingZeros :: Int -> Int # | |||||
Data Int | @since base-4.0.0.0 | ||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int # dataTypeOf :: Int -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) # gmapT :: (forall b. Data b => b -> b) -> Int -> Int # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # | |||||
Bounded Int | @since base-2.01 | ||||
Enum Int | @since base-2.01 | ||||
Num Int | @since base-2.01 | ||||
Read Int | @since base-2.01 | ||||
Integral Int | @since base-2.0.1 | ||||
Real Int | @since base-2.0.1 | ||||
Defined in GHC.Internal.Real Methods toRational :: Int -> Rational # | |||||
Show Int | @since base-2.01 | ||||
Eq Int | |||||
Ord Int | |||||
Hashable Int | |||||
Defined in Data.Hashable.Class | |||||
HpcHash Int | |||||
Defined in Trace.Hpc.Util | |||||
FromFormKey Int | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Int | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Val Int | |||||
ToSql Int | Corresponds to BIGINT type of SQL Server. | ||||
Defined in Database.ODBC.SQLServer | |||||
Pretty Int |
| ||||
Defined in Prettyprinter.Internal | |||||
Uniform Int | |||||
Defined in System.Random.Internal Methods uniformM :: StatefulGen g m => g -> m Int # | |||||
UniformRange Int | |||||
Defined in System.Random.Internal | |||||
ByteSource Int | |||||
Defined in Data.UUID.Types.Internal.Builder | |||||
Unbox Int | |||||
Defined in Data.Vector.Unboxed.Base | |||||
IArray UArray Int | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int -> (i, i) # numElements :: Ix i => UArray i Int -> Int # unsafeArray :: Ix i => (i, i) -> [(Int, Int)] -> UArray i Int # unsafeAt :: Ix i => UArray i Int -> Int -> Int # unsafeReplace :: Ix i => UArray i Int -> [(Int, Int)] -> UArray i Int # unsafeAccum :: Ix i => (Int -> e' -> Int) -> UArray i Int -> [(Int, e')] -> UArray i Int # unsafeAccumArray :: Ix i => (Int -> e' -> Int) -> Int -> (i, i) -> [(Int, e')] -> UArray i Int # | |||||
Foldable1WithIndex Int NonEmpty | |||||
Defined in WithIndex Methods ifoldMap1 :: Semigroup m => (Int -> a -> m) -> NonEmpty a -> m # ifoldMap1' :: Semigroup m => (Int -> a -> m) -> NonEmpty a -> m # ifoldrMap1 :: (Int -> a -> b) -> (Int -> a -> b -> b) -> NonEmpty a -> b # ifoldlMap1' :: (Int -> a -> b) -> (Int -> b -> a -> b) -> NonEmpty a -> b # ifoldlMap1 :: (Int -> a -> b) -> (Int -> b -> a -> b) -> NonEmpty a -> b # ifoldrMap1' :: (Int -> a -> b) -> (Int -> a -> b -> b) -> NonEmpty a -> b # | |||||
FoldableWithIndex Int IntMap | |||||
Defined in WithIndex | |||||
FoldableWithIndex Int Seq | |||||
FoldableWithIndex Int NonEmpty | |||||
Defined in WithIndex | |||||
FoldableWithIndex Int ZipList | |||||
Defined in WithIndex | |||||
FoldableWithIndex Int Deque | |||||
Defined in Control.Lens.Internal.Deque | |||||
FoldableWithIndex Int [] | |||||
FunctorWithIndex Int IntMap | |||||
FunctorWithIndex Int Seq | The position in the | ||||
FunctorWithIndex Int NonEmpty | |||||
FunctorWithIndex Int ZipList | Same instance as for | ||||
FunctorWithIndex Int Deque | |||||
FunctorWithIndex Int [] | The position in the list is available as the index. | ||||
TraversableWithIndex Int IntMap | |||||
TraversableWithIndex Int Seq | |||||
TraversableWithIndex Int NonEmpty | |||||
TraversableWithIndex Int ZipList | |||||
TraversableWithIndex Int Deque | |||||
Defined in Control.Lens.Internal.Deque | |||||
TraversableWithIndex Int [] | |||||
Defined in WithIndex Methods itraverse :: Applicative f => (Int -> a -> f b) -> [a] -> f [b] # | |||||
TraverseMax Int IntMap | |||||
Defined in Control.Lens.Traversal Methods traverseMax :: IndexedTraversal' Int (IntMap v) v # | |||||
TraverseMin Int IntMap | |||||
Defined in Control.Lens.Traversal Methods traverseMin :: IndexedTraversal' Int (IntMap v) v # | |||||
Lift Int | |||||
Vector Vector Int | |||||
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Int -> ST s (Vector Int) # basicUnsafeThaw :: Vector Int -> ST s (Mutable Vector s Int) # basicLength :: Vector Int -> Int # basicUnsafeSlice :: Int -> Int -> Vector Int -> Vector Int # basicUnsafeIndexM :: Vector Int -> Int -> Box Int # basicUnsafeCopy :: Mutable Vector s Int -> Vector Int -> ST s () # | |||||
MVector MVector Int | |||||
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Int -> Int # basicUnsafeSlice :: Int -> Int -> MVector s Int -> MVector s Int # basicOverlaps :: MVector s Int -> MVector s Int -> Bool # basicUnsafeNew :: Int -> ST s (MVector s Int) # basicInitialize :: MVector s Int -> ST s () # basicUnsafeReplicate :: Int -> Int -> ST s (MVector s Int) # basicUnsafeRead :: MVector s Int -> Int -> ST s Int # basicUnsafeWrite :: MVector s Int -> Int -> Int -> ST s () # basicClear :: MVector s Int -> ST s () # basicSet :: MVector s Int -> Int -> ST s () # basicUnsafeCopy :: MVector s Int -> MVector s Int -> ST s () # basicUnsafeMove :: MVector s Int -> MVector s Int -> ST s () # basicUnsafeGrow :: MVector s Int -> Int -> ST s (MVector s Int) # | |||||
Reifies Z Int | |||||
Defined in Data.Reflection | |||||
Reifies n Int => Reifies (D n :: Type) Int | |||||
Defined in Data.Reflection | |||||
Reifies n Int => Reifies (PD n :: Type) Int | |||||
Defined in Data.Reflection | |||||
Reifies n Int => Reifies (SD n :: Type) Int | |||||
Defined in Data.Reflection | |||||
Generic1 (URec Int :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UInt :: Type -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UInt m -> m # foldMap :: Monoid m => (a -> m) -> UInt a -> m # foldMap' :: Monoid m => (a -> m) -> UInt a -> m # foldr :: (a -> b -> b) -> b -> UInt a -> b # foldr' :: (a -> b -> b) -> b -> UInt a -> b # foldl :: (b -> a -> b) -> b -> UInt a -> b # foldl' :: (b -> a -> b) -> b -> UInt a -> b # foldr1 :: (a -> a -> a) -> UInt a -> a # foldl1 :: (a -> a -> a) -> UInt a -> a # elem :: Eq a => a -> UInt a -> Bool # maximum :: Ord a => UInt a -> a # | |||||
Traversable (UInt :: Type -> Type) | @since base-4.9.0.0 | ||||
FoldableWithIndex [Int] Tree | |||||
Defined in WithIndex | |||||
FunctorWithIndex [Int] Tree | |||||
TraversableWithIndex [Int] Tree | |||||
Bizarre (Indexed Int) Mafic | |||||
Defined in Control.Lens.Internal.Magma | |||||
MArray (STUArray s) Int (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int -> ST s (i, i) # getNumElements :: Ix i => STUArray s i Int -> ST s Int # newArray :: Ix i => (i, i) -> Int -> ST s (STUArray s i Int) # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) # unsafeRead :: Ix i => STUArray s i Int -> Int -> ST s Int # unsafeWrite :: Ix i => STUArray s i Int -> Int -> Int -> ST s () # | |||||
Functor (URec Int :: Type -> Type) | @since base-4.9.0.0 | ||||
Generic (URec Int p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Int p) | @since base-4.9.0.0 | ||||
Eq (URec Int p) | @since base-4.9.0.0 | ||||
Ord (URec Int p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type NatNumMaxBound Int | |||||
Defined in Basement.Nat | |||||
type Difference Int | |||||
Defined in Basement.Numerical.Subtractive | |||||
type PrimSize Int | |||||
Defined in Basement.PrimType | |||||
newtype Vector Int | |||||
data URec Int (p :: k) | Used for marking occurrences of @since base-4.9.0.0 | ||||
type ByteSink Int g | |||||
Defined in Data.UUID.Types.Internal.Builder type ByteSink Int g = Takes4Bytes g | |||||
newtype MVector s Int | |||||
type Rep1 (URec Int :: k -> Type) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Int p) | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Generics |
newtype Environment #
Application environment, like prod
, devel
, testing
.
Constructors
Environment | |
Fields |
Instances
FromJSON Environment | |||||
Defined in Katip.Core | |||||
ToJSON Environment | |||||
Defined in Katip.Core Methods toJSON :: Environment -> Value # toEncoding :: Environment -> Encoding # toJSONList :: [Environment] -> Value # toEncodingList :: [Environment] -> Encoding # omitField :: Environment -> Bool # | |||||
IsString Environment | |||||
Defined in Katip.Core Methods fromString :: String -> Environment # | |||||
Generic Environment | |||||
Defined in Katip.Core Associated Types
| |||||
Read Environment | |||||
Defined in Katip.Core Methods readsPrec :: Int -> ReadS Environment # readList :: ReadS [Environment] # readPrec :: ReadPrec Environment # readListPrec :: ReadPrec [Environment] # | |||||
Show Environment | |||||
Defined in Katip.Core Methods showsPrec :: Int -> Environment -> ShowS # show :: Environment -> String # showList :: [Environment] -> ShowS # | |||||
Eq Environment | |||||
Defined in Katip.Core | |||||
Ord Environment | |||||
Defined in Katip.Core Methods compare :: Environment -> Environment -> Ordering # (<) :: Environment -> Environment -> Bool # (<=) :: Environment -> Environment -> Bool # (>) :: Environment -> Environment -> Bool # (>=) :: Environment -> Environment -> Bool # max :: Environment -> Environment -> Environment # min :: Environment -> Environment -> Environment # | |||||
type Rep Environment | |||||
Defined in Katip.Core type Rep Environment = D1 ('MetaData "Environment" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "getEnvironment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
Constructors
Unit | Expression is at the row level |
Agg | Aggregate functions, like |
Analytic | Analytic level (some backends) |
Instances
Data AggLevel | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AggLevel -> c AggLevel # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AggLevel # toConstr :: AggLevel -> Constr # dataTypeOf :: AggLevel -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AggLevel) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AggLevel) # gmapT :: (forall b. Data b => b -> b) -> AggLevel -> AggLevel # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AggLevel -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AggLevel -> r # gmapQ :: (forall d. Data d => d -> u) -> AggLevel -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> AggLevel -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel # | |
Show AggLevel | |
Eq AggLevel | |
Ord AggLevel | |
Defined in Napkin.Types.Core |
assert :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> AssertionStatus -> Sem r () #
assertError :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem ((Error Text :: (Type -> Type) -> Type -> Type) ': r) () -> Sem r () #
optional :: Alternative f => f a -> f (Maybe a) #
One or none.
It is useful for modelling any computation that is allowed to fail.
Examples
Using the Alternative
instance of Control.Monad.Except, the following functions:
>>>
import Control.Monad.Except
>>>
canFail = throwError "it failed" :: Except String Int
>>>
final = return 42 :: Except String Int
Can be combined by allowing the first function to fail:
>>>
runExcept $ canFail *> final
Left "it failed"
>>>
runExcept $ optional canFail *> final
Right 42
Constructors
Lit Value | |
Var (Ref SExp) | |
ArraySelect Query | |
ArrayItem | |
Array | |
Fields | |
Struct | |
Fields | |
FieldAccess | |
Fields | |
Extern ExternFun | external function call |
Case [(SExp, SExp)] SExp | case with a final default |
ExceptColumns SExp [Ref SExp] | t.* EXCEPT(a,b,c) |
SubQuery Query | |
NativeExpr NativeExpr |
Instances
NFData SExp | |||||
Defined in Napkin.Types.Core | |||||
Data SExp | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SExp -> c SExp # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SExp # dataTypeOf :: SExp -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SExp) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SExp) # gmapT :: (forall b. Data b => b -> b) -> SExp -> SExp # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SExp -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SExp -> r # gmapQ :: (forall d. Data d => d -> u) -> SExp -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SExp -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SExp -> m SExp # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SExp -> m SExp # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SExp -> m SExp # | |||||
Generic SExp | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show SExp | |||||
Eq SExp | |||||
Ord SExp | |||||
HasDeps SExp | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer SExp | |||||
TableRenamer SExp | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift SExp | |||||
HasDeps (Alias SExp) | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer (Alias SExp) | |||||
TableRenamer (Alias SExp) | |||||
HasDeps (OMap Name SExp) | |||||
type Rep SExp | |||||
Defined in Napkin.Types.Core type Rep SExp = D1 ('MetaData "SExp" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "Lit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)) :+: (C1 ('MetaCons "Var" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref SExp))) :+: C1 ('MetaCons "ArraySelect" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))) :+: (C1 ('MetaCons "ArrayItem" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_sExp_ArrayItem_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayBase) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_null") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nullability)) :*: (S1 ('MetaSel ('Just "_sExp_ArrayItem_arr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_idx") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp))) :+: (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Array_itemType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type)) :*: S1 ('MetaSel ('Just "_sExp_Array_items") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: C1 ('MetaCons "Struct" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Struct_types") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (OMap StructField Type))) :*: S1 ('MetaSel ('Just "_sExp_Struct_values") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField SExp)))))) :+: ((C1 ('MetaCons "FieldAccess" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_fieldAccess_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_fieldAccess_name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StructField)) :+: (C1 ('MetaCons "Extern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExternFun)) :+: C1 ('MetaCons "Case" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SExp, SExp)]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)))) :+: (C1 ('MetaCons "ExceptColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref SExp])) :+: (C1 ('MetaCons "SubQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :+: C1 ('MetaCons "NativeExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeExpr)))))) |
Constructors
Field Nullability Type |
class (Eq (BackendSchemaField bk), Show (BackendSchemaField bk)) => HasBackendSchemaField (bk :: k) where #
data SQLDialect #
Constructors
NapkinSQL SimpleSQLParserDialect | |
PostgreSQL | |
SimpleSQLParser SimpleSQLParserDialect | |
RawSQL |
Instances
FromJSON SQLDialect | |
Defined in Napkin.Parse.Base | |
Show SQLDialect | |
Defined in Napkin.Parse.Base Methods showsPrec :: Int -> SQLDialect -> ShowS # show :: SQLDialect -> String # showList :: [SQLDialect] -> ShowS # | |
Eq SQLDialect | |
Defined in Napkin.Parse.Base |
Constructors
Millennium | |
Century | |
Decade | |
Epoch | |
Year | |
Quarter | |
Month | |
Week | |
DayOfWeek | |
DayOfYear | |
Day | |
Hour | |
Minute | |
Second | |
Millisecond | |
Microsecond |
Instances
NFData DatePart | |||||
Defined in Napkin.Types.Core | |||||
Data DatePart | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatePart -> c DatePart # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatePart # toConstr :: DatePart -> Constr # dataTypeOf :: DatePart -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatePart) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatePart) # gmapT :: (forall b. Data b => b -> b) -> DatePart -> DatePart # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatePart -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatePart -> r # gmapQ :: (forall d. Data d => d -> u) -> DatePart -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DatePart -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart # | |||||
Generic DatePart | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show DatePart | |||||
Eq DatePart | |||||
Ord DatePart | |||||
Defined in Napkin.Types.Core | |||||
Val DatePart | |||||
Lift DatePart | |||||
type Rep DatePart | |||||
Defined in Napkin.Types.Core type Rep DatePart = D1 ('MetaData "DatePart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "Millennium" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Century" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Decade" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Epoch" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Year" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Quarter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Month" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Week" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "DayOfWeek" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DayOfYear" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Day" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Hour" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Minute" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Second" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Millisecond" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Microsecond" 'PrefixI 'False) (U1 :: Type -> Type))))) |
data AssertionStatus #
Instances
ToJSON AssertionStatus | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods toJSON :: AssertionStatus -> Value # toEncoding :: AssertionStatus -> Encoding # toJSONList :: [AssertionStatus] -> Value # toEncodingList :: [AssertionStatus] -> Encoding # omitField :: AssertionStatus -> Bool # | |||||
Generic AssertionStatus | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Associated Types
Methods from :: AssertionStatus -> Rep AssertionStatus x # to :: Rep AssertionStatus x -> AssertionStatus # | |||||
Show AssertionStatus | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionStatus -> ShowS # show :: AssertionStatus -> String # showList :: [AssertionStatus] -> ShowS # | |||||
Eq AssertionStatus | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionStatus -> AssertionStatus -> Bool # (/=) :: AssertionStatus -> AssertionStatus -> Bool # | |||||
type Rep AssertionStatus | |||||
Defined in Napkin.Run.Effects.Languages.Assertion type Rep AssertionStatus = D1 ('MetaData "AssertionStatus" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Success" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Failure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) |
data Assertion (m :: k) a where #
Assertion effects so we can skip past them in dry runs, and optionally throw exceptions or just collect them along the way for final reporting, etc..
Constructors
Assert' :: forall {k} (m :: k). AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Assertion m () | Assertions are run-time checks based on actual results that may be returned by various operations. Dry runs may ignore these failures, but they're respected in real operations. |
data SpecRuntime b #
Constructors
SpecRuntime | |
Fields
|
Instances
Generic (SpecRuntime b) | |||||
Defined in Napkin.Spec.Types.Runtime Associated Types
Methods from :: SpecRuntime b -> Rep (SpecRuntime b) x # to :: Rep (SpecRuntime b) x -> SpecRuntime b # | |||||
type Rep (SpecRuntime b) | |||||
Defined in Napkin.Spec.Types.Runtime type Rep (SpecRuntime b) = D1 ('MetaData "SpecRuntime" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecRuntime" 'PrefixI 'True) (S1 ('MetaSel ('Just "connection") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendConn b)))) |
Instances
Data Function | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Function -> c Function # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Function # toConstr :: Function -> Constr # dataTypeOf :: Function -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Function) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Function) # gmapT :: (forall b. Data b => b -> b) -> Function -> Function # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Function -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Function -> r # gmapQ :: (forall d. Data d => d -> u) -> Function -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Function -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Function -> m Function # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Function -> m Function # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Function -> m Function # |
Constructors
Specs | |
Fields
|
Instances
Default (Specs b) | |||||
Defined in Napkin.Spec.Types.Spec | |||||
Generic (Specs b) | |||||
Defined in Napkin.Spec.Types.Spec Associated Types
| |||||
MonadState (Specs b) (Spec b) | |||||
type Rep (Specs b) | |||||
Defined in Napkin.Spec.Types.Spec type Rep (Specs b) = D1 ('MetaData "Specs" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Specs" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SpecTableMap b)) :*: S1 ('MetaSel ('Just "hooks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (GlobalHooks b))) :*: (S1 ('MetaSel ('Just "metaArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecMetaArgs) :*: S1 ('MetaSel ('Just "transformer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryTransformer)))) |
Constructors
VDouble !Double | |
VInt !Int64 | |
VBool !Bool | |
VDate !Day | |
VDateTime !UTCTime | |
VText !Text | |
VBinary !ByteString | |
VInterval !Interval | |
VNull | |
VDatePart !DatePart |
Instances
NFData Value | |||||
Defined in Napkin.Types.Core | |||||
Buildable Value | |||||
Defined in Napkin.Types.Core | |||||
Data Value | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Value -> c Value # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Value # dataTypeOf :: Value -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Value) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Value) # gmapT :: (forall b. Data b => b -> b) -> Value -> Value # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r # gmapQ :: (forall d. Data d => d -> u) -> Value -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Value -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Value -> m Value # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value # | |||||
Generic Value | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Value | |||||
Eq Value | |||||
Ord Value | |||||
Val Value | |||||
Lift Value | |||||
FromField (Named Value) | |||||
Defined in Napkin.Run.PGCommon Methods fromField :: FieldParser (Named Value) # | |||||
type Rep Value | |||||
Defined in Napkin.Types.Core type Rep Value = D1 ('MetaData "Value" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "VDouble" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Double)) :+: C1 ('MetaCons "VInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int64))) :+: (C1 ('MetaCons "VBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)) :+: (C1 ('MetaCons "VDate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "VDateTime" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 UTCTime))))) :+: ((C1 ('MetaCons "VText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "VBinary" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 ByteString))) :+: (C1 ('MetaCons "VInterval" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Interval)) :+: (C1 ('MetaCons "VNull" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VDatePart" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DatePart)))))) |
A space efficient, packed, unboxed Unicode text type.
Instances
FromJSON Text | |||||||||
Defined in Data.Aeson.Types.FromJSON | |||||||||
FromJSONKey Text | |||||||||
Defined in Data.Aeson.Types.FromJSON | |||||||||
ToJSON Text | |||||||||
ToJSONKey Text | |||||||||
Defined in Data.Aeson.Types.ToJSON | |||||||||
Chunk Text | |||||||||
Defined in Data.Attoparsec.Internal.Types Associated Types
Methods pappendChunk :: State Text -> Text -> State Text atBufferEnd :: Text -> State Text -> Pos bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int) chunkElemToChar :: Text -> ChunkElem Text -> Char | |||||||||
FromBuilder Text | |||||||||
Defined in Fmt.Internal.Core Methods fromBuilder :: Builder -> Text # | |||||||||
Buildable Text | |||||||||
Defined in Formatting.Buildable | |||||||||
Hashable Text | |||||||||
Defined in Data.Hashable.Class | |||||||||
FromFormKey Text | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
ToFormKey Text | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
Ixed Text | |||||||||
Defined in Control.Lens.At | |||||||||
AsEmpty Text | |||||||||
Defined in Control.Lens.Empty | |||||||||
Reversing Text | |||||||||
Defined in Control.Lens.Internal.Iso | |||||||||
Prefixed Text | |||||||||
Suffixed Text | |||||||||
IsText Text | |||||||||
AsJSON Text | |||||||||
AsNumber Text | |||||||||
AsValue Text | |||||||||
IsKey Text | |||||||||
Stream Text | |||||||||
Defined in Text.Megaparsec.Stream Associated Types
Methods tokenToChunk :: Proxy Text -> Token Text -> Tokens Text # tokensToChunk :: Proxy Text -> [Token Text] -> Tokens Text # chunkToTokens :: Proxy Text -> Tokens Text -> [Token Text] # chunkLength :: Proxy Text -> Tokens Text -> Int # chunkEmpty :: Proxy Text -> Tokens Text -> Bool # take1_ :: Text -> Maybe (Token Text, Text) # takeN_ :: Int -> Text -> Maybe (Tokens Text, Text) # takeWhile_ :: (Token Text -> Bool) -> Text -> (Tokens Text, Text) # | |||||||||
TraversableStream Text | |||||||||
VisualStream Text | |||||||||
GrowingAppend Text | |||||||||
Defined in Data.MonoTraversable | |||||||||
MonoFoldable Text | |||||||||
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m # ofoldr :: (Element Text -> b -> b) -> b -> Text -> b # ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a # otoList :: Text -> [Element Text] # oall :: (Element Text -> Bool) -> Text -> Bool # oany :: (Element Text -> Bool) -> Text -> Bool # ocompareLength :: Integral i => Text -> i -> Ordering # otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () # ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () # omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () # oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () # ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a # ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m # ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text # ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text # headEx :: Text -> Element Text # lastEx :: Text -> Element Text # unsafeHead :: Text -> Element Text # unsafeLast :: Text -> Element Text # maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text # minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text # | |||||||||
MonoFunctor Text | |||||||||
MonoPointed Text | |||||||||
MonoTraversable Text | |||||||||
IsSequence Text | |||||||||
Defined in Data.Sequences Methods fromList :: [Element Text] -> Text # lengthIndex :: Text -> Index Text # break :: (Element Text -> Bool) -> Text -> (Text, Text) # span :: (Element Text -> Bool) -> Text -> (Text, Text) # dropWhile :: (Element Text -> Bool) -> Text -> Text # takeWhile :: (Element Text -> Bool) -> Text -> Text # splitAt :: Index Text -> Text -> (Text, Text) # unsafeSplitAt :: Index Text -> Text -> (Text, Text) # take :: Index Text -> Text -> Text # unsafeTake :: Index Text -> Text -> Text # drop :: Index Text -> Text -> Text # unsafeDrop :: Index Text -> Text -> Text # dropEnd :: Index Text -> Text -> Text # partition :: (Element Text -> Bool) -> Text -> (Text, Text) # uncons :: Text -> Maybe (Element Text, Text) # unsnoc :: Text -> Maybe (Text, Element Text) # filter :: (Element Text -> Bool) -> Text -> Text # filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text # replicate :: Index Text -> Element Text -> Text # replicateM :: Monad m => Index Text -> m (Element Text) -> m Text # groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] # groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] # subsequences :: Text -> [Text] # permutations :: Text -> [Text] # tailMay :: Text -> Maybe Text # initMay :: Text -> Maybe Text # unsafeTail :: Text -> Text # unsafeInit :: Text -> Text # index :: Text -> Index Text -> Maybe (Element Text) # indexEx :: Text -> Index Text -> Element Text # unsafeIndex :: Text -> Index Text -> Element Text # | |||||||||
SemiSequence Text | |||||||||
Defined in Data.Sequences | |||||||||
Textual Text | |||||||||
IsRef Text | |||||||||
Defined in Napkin.Types.Core | |||||||||
Val Text | |||||||||
ToNapkinError Text | |||||||||
Defined in Napkin.Run.Types.ErrorReporting Methods toNapkinError :: Text -> NapkinError # | |||||||||
ToSql Text | Corresponds to NTEXT (Unicode) of SQL Server. Note that if your character exceeds the range supported by a wide-char (16-bit), that cannot be sent to the server. | ||||||||
Defined in Database.ODBC.SQLServer | |||||||||
Pretty Text | Automatically converts all newlines to
Note that
Manually use | ||||||||
Defined in Prettyprinter.Internal | |||||||||
One Text | Create singleton strict
law> | ||||||||
ToLText Text | |||||||||
Defined in Relude.String.Conversion | |||||||||
ToString Text | |||||||||
Defined in Relude.String.Conversion | |||||||||
ToText Text | |||||||||
Defined in Relude.String.Conversion | |||||||||
LazySequence Text Text | |||||||||
Utf8 Text ByteString | |||||||||
Defined in Data.Sequences | |||||||||
ConvertUtf8 Text ByteString | |||||||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: Text -> ByteString # decodeUtf8 :: ByteString -> Text # decodeUtf8Strict :: ByteString -> Either UnicodeException Text # | |||||||||
ConvertUtf8 Text ShortByteString | Since: relude-0.6.0.0 | ||||||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: Text -> ShortByteString # decodeUtf8 :: ShortByteString -> Text # decodeUtf8Strict :: ShortByteString -> Either UnicodeException Text # | |||||||||
ConvertUtf8 Text LByteString | |||||||||
Defined in Relude.String.Conversion Methods encodeUtf8 :: Text -> LByteString # decodeUtf8 :: LByteString -> Text # decodeUtf8Strict :: LByteString -> Either UnicodeException Text # | |||||||||
LazyStrict LText Text | |||||||||
StringConv ByteString Text | |||||||||
Defined in Data.String.Conv Methods strConv :: Leniency -> ByteString -> Text # | |||||||||
StringConv ByteString Text | |||||||||
Defined in Data.String.Conv Methods strConv :: Leniency -> ByteString -> Text # | |||||||||
StringConv Text ByteString | |||||||||
Defined in Data.String.Conv Methods strConv :: Leniency -> Text -> ByteString # | |||||||||
StringConv Text ByteString | |||||||||
Defined in Data.String.Conv Methods strConv :: Leniency -> Text -> ByteString # | |||||||||
StringConv Text Text | |||||||||
StringConv Text Text | |||||||||
StringConv Text String | |||||||||
StringConv Text Text | |||||||||
StringConv String Text | |||||||||
DumpPayload Text (b :: k) | |||||||||
Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types Methods renderDumpPayload_ :: Text -> Doc # | |||||||||
MimeRender PlainText Text | fromStrict . TextS.encodeUtf8 | ||||||||
Defined in Servant.API.ContentTypes Methods mimeRender :: Proxy PlainText -> Text -> ByteString # | |||||||||
MimeUnrender PlainText Text | left show . TextS.decodeUtf8' . toStrict | ||||||||
Defined in Servant.API.ContentTypes Methods mimeUnrender :: Proxy PlainText -> ByteString -> Either String Text # mimeUnrenderWithType :: Proxy PlainText -> MediaType -> ByteString -> Either String Text # | |||||||||
Cons Text Text Char Char | |||||||||
Snoc Text Text Char Char | |||||||||
(a ~ Char, b ~ Char) => Each Text Text a b |
| ||||||||
Stream (NoShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream Associated Types
Methods tokenToChunk :: Proxy (NoShareInput Text) -> Token (NoShareInput Text) -> Tokens (NoShareInput Text) # tokensToChunk :: Proxy (NoShareInput Text) -> [Token (NoShareInput Text)] -> Tokens (NoShareInput Text) # chunkToTokens :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> [Token (NoShareInput Text)] # chunkLength :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Int # chunkEmpty :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Bool # take1_ :: NoShareInput Text -> Maybe (Token (NoShareInput Text), NoShareInput Text) # takeN_ :: Int -> NoShareInput Text -> Maybe (Tokens (NoShareInput Text), NoShareInput Text) # takeWhile_ :: (Token (NoShareInput Text) -> Bool) -> NoShareInput Text -> (Tokens (NoShareInput Text), NoShareInput Text) # | |||||||||
Stream (ShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream Associated Types
Methods tokenToChunk :: Proxy (ShareInput Text) -> Token (ShareInput Text) -> Tokens (ShareInput Text) # tokensToChunk :: Proxy (ShareInput Text) -> [Token (ShareInput Text)] -> Tokens (ShareInput Text) # chunkToTokens :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> [Token (ShareInput Text)] # chunkLength :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Int # chunkEmpty :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Bool # take1_ :: ShareInput Text -> Maybe (Token (ShareInput Text), ShareInput Text) # takeN_ :: Int -> ShareInput Text -> Maybe (Tokens (ShareInput Text), ShareInput Text) # takeWhile_ :: (Token (ShareInput Text) -> Bool) -> ShareInput Text -> (Tokens (ShareInput Text), ShareInput Text) # | |||||||||
type ChunkElem Text | |||||||||
Defined in Data.Attoparsec.Internal.Types | |||||||||
type State Text | |||||||||
Defined in Data.Attoparsec.Internal.Types type State Text = Buffer | |||||||||
type Item Text | |||||||||
type Index Text | |||||||||
Defined in Control.Lens.At | |||||||||
type IxValue Text | |||||||||
Defined in Control.Lens.At | |||||||||
type Token Text | |||||||||
Defined in Text.Megaparsec.Stream | |||||||||
type Tokens Text | |||||||||
Defined in Text.Megaparsec.Stream | |||||||||
type Element Text | |||||||||
Defined in Data.MonoTraversable | |||||||||
type Index Text | |||||||||
Defined in Data.Sequences | |||||||||
type OneItem Text | |||||||||
Defined in Relude.Container.One | |||||||||
type Builder 'True Text | |||||||||
Defined in Data.String.Interpolate.Conversion.TextSink | |||||||||
type Token (NoShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream | |||||||||
type Token (ShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream | |||||||||
type Tokens (NoShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream | |||||||||
type Tokens (ShareInput Text) | |||||||||
Defined in Text.Megaparsec.Stream |
data WithSpecTable a #
Constructors
WithSpecTable | |
Fields
|
Instances
Functor WithSpecTable | |||||
Defined in Napkin.Types.Core Methods fmap :: (a -> b) -> WithSpecTable a -> WithSpecTable b # (<$) :: a -> WithSpecTable b -> WithSpecTable a # | |||||
Generic (WithSpecTable a) | |||||
Defined in Napkin.Types.Core Associated Types
Methods from :: WithSpecTable a -> Rep (WithSpecTable a) x # to :: Rep (WithSpecTable a) x -> WithSpecTable a # | |||||
Show a => Show (WithSpecTable a) | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WithSpecTable a -> ShowS # show :: WithSpecTable a -> String # showList :: [WithSpecTable a] -> ShowS # | |||||
Eq a => Eq (WithSpecTable a) | |||||
Defined in Napkin.Types.Core Methods (==) :: WithSpecTable a -> WithSpecTable a -> Bool # (/=) :: WithSpecTable a -> WithSpecTable a -> Bool # | |||||
Ord a => Ord (WithSpecTable a) | |||||
Defined in Napkin.Types.Core Methods compare :: WithSpecTable a -> WithSpecTable a -> Ordering # (<) :: WithSpecTable a -> WithSpecTable a -> Bool # (<=) :: WithSpecTable a -> WithSpecTable a -> Bool # (>) :: WithSpecTable a -> WithSpecTable a -> Bool # (>=) :: WithSpecTable a -> WithSpecTable a -> Bool # max :: WithSpecTable a -> WithSpecTable a -> WithSpecTable a # min :: WithSpecTable a -> WithSpecTable a -> WithSpecTable a # | |||||
type Rep (WithSpecTable a) | |||||
Defined in Napkin.Types.Core type Rep (WithSpecTable a) = D1 ('MetaData "WithSpecTable" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithSpecTable" 'PrefixI 'True) (S1 ('MetaSel ('Just "specTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
This is the simplest representation of UTC. It consists of the day number, and a time offset from midnight. Note that if a day has a leap second added to it, it will have 86401 seconds.
Constructors
UTCTime | |
Fields
|
Instances
FromJSON UTCTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey UTCTime | |
Defined in Data.Aeson.Types.FromJSON Methods | |
ToJSON UTCTime | |
ToJSONKey UTCTime | |
Defined in Data.Aeson.Types.ToJSON | |
NFData UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
Buildable UTCTime | |
Defined in Formatting.Buildable | |
Outputable UTCTime | |
Defined in GHC.Utils.Outputable | |
Data UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime # toConstr :: UTCTime -> Constr # dataTypeOf :: UTCTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) # gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r # gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # | |
Eq UTCTime | |
Ord UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
FromFormKey UTCTime | |
Defined in Web.Internal.FormUrlEncoded | |
ToFormKey UTCTime | |
Defined in Web.Internal.FormUrlEncoded | |
Val UTCTime | |
(TypeError ((('Text "Instance for UTCTime is not possible:" ':$$: 'Text "SQL Server does not support time zones. ") ':$$: 'Text "You can use utcToLocalTime to make a LocalTime, and") ':$$: 'Text "wrap your value in either (Datetime2 foo) or (Smalldatetime foo).") :: Constraint) => ToSql UTCTime | You cannot use this instance. Wrap your value in either
|
Defined in Database.ODBC.SQLServer | |
ISO8601 UTCTime |
|
Defined in Data.Time.Format.ISO8601 Methods | |
FromJSON (UTCTime -> OAuthToken s) | |
Defined in Gogol.Internal.Auth Methods parseJSON :: Value -> Parser (UTCTime -> OAuthToken s) # parseJSONList :: Value -> Parser [UTCTime -> OAuthToken s] # omittedField :: Maybe (UTCTime -> OAuthToken s) # |
Instances
Applicative Q | |
Functor Q | |
Monad Q | |
MonadState QState Q | |
RenderSql Query backend => RenderSql (Q a) (backend :: k) | Monadic query interface |
AsRelation (Q a) | |
Defined in Napkin.Untyped.Monad Methods asRelation :: Q a -> Relation # | |
HasDefinition (Q ()) | |
MaybeQuery (Q ()) | |
(<**>) :: Applicative f => f a -> f (a -> b) -> f b infixl 4 #
A variant of <*>
with the types of the arguments reversed. It differs from
in that the effects are resolved in the order the arguments are
presented.flip
(<*>)
Examples
>>>
(<**>) (print 1) (id <$ print 2)
1 2
>>>
flip (<*>) (print 1) (id <$ print 2)
2 1
>>>
ZipList [4, 5, 6] <**> ZipList [(+1), (*2), (/3)]
ZipList {getZipList = [5.0,10.0,2.0]}
getCurrentTime :: forall (effs :: EffectRow). Member (Time :: (Type -> Type) -> Type -> Type) effs => Sem effs UTCTime #
liftA :: Applicative f => (a -> b) -> f a -> f b #
Lift a function to actions.
Equivalent to Functor's fmap
but implemented using only Applicative
's methods:
liftA
f a = pure
f <*>
a
As such this function may be used to implement a Functor
instance from an Applicative
one.
Examples
Using the Applicative instance for Lists:
>>>
liftA (+1) [1, 2]
[2,3]
Or the Applicative instance for Maybe
>>>
liftA (+1) (Just 3)
Just 4
liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #
Lift a ternary function to actions.
sequence :: (Traversable t, Monad m) => t (m a) -> m (t a) #
Evaluate each monadic action in the structure from left to
right, and collect the results. For a version that ignores the
results see sequence_
.
Examples
Basic usage:
The first two examples are instances where the input and
and output of sequence
are isomorphic.
>>>
sequence $ Right [1,2,3,4]
[Right 1,Right 2,Right 3,Right 4]
>>>
sequence $ [Right 1,Right 2,Right 3,Right 4]
Right [1,2,3,4]
The following examples demonstrate short circuit behavior
for sequence
.
>>>
sequence $ Left [1,2,3,4]
Left [1,2,3,4]
>>>
sequence $ [Left 0, Right 1,Right 2,Right 3,Right 4]
Left 0
mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b) #
Map each element of a structure to a monadic action, evaluate
these actions from left to right, and collect the results. For
a version that ignores the results see mapM_
.
Examples
liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #
Promote a function to a monad, scanning the monadic arguments from
left to right (cf. liftM2
).
liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #
Promote a function to a monad, scanning the monadic arguments from
left to right (cf. liftM2
).
liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #
Promote a function to a monad, scanning the monadic arguments from
left to right (cf. liftM2
).
asum :: (Foldable t, Alternative f) => t (f a) -> f a #
The sum of a collection of actions using (<|>)
, generalizing concat
.
asum
is just like msum
, but generalised to Alternative
.
Examples
Basic usage:
>>>
asum [Just "Hello", Nothing, Just "World"]
Just "Hello"
forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #
forever :: Applicative f => f a -> f b #
Repeat an action indefinitely.
Examples
A common use of forever
is to process input from network sockets,
Handle
s, and channels
(e.g. MVar
and
Chan
).
For example, here is how we might implement an echo
server, using
forever
both to listen for client connections on a network socket
and to echo client input on client connection handles:
echoServer :: Socket -> IO () echoServer socket =forever
$ do client <- accept socketforkFinally
(echo client) (\_ -> hClose client) where echo :: Handle -> IO () echo client =forever
$ hGetLine client >>= hPutStrLn client
Note that "forever" isn't necessarily non-terminating.
If the action is in a
and short-circuits after some number of iterations.
then MonadPlus
actually returns forever
mzero
, effectively short-circuiting its caller.
mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #
The mapAndUnzipM
function maps its first argument over a list, returning
the result as a pair of lists. This function is mainly used with complicated
data structures or a state monad.
zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #
zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #
foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #
Like foldM
, but discards the result.
replicateM :: Applicative m => Int -> m a -> m [a] #
performs the action replicateM
n actact
n
times,
and then returns the list of results.
replicateM n (pure x) == replicate
n x
Examples
>>>
replicateM 3 getLine
hi heya hiya ["hi","heya","hiya"]
>>>
import Control.Monad.State
>>>
runState (replicateM 3 $ state $ \s -> (s, s + 1)) 1
([1,2,3],4)
replicateM_ :: Applicative m => Int -> m a -> m () #
Lists, but with an Applicative
functor based on zipping.
Examples
In contrast to the Applicative
for List
:
>>>
(+) <$> [1, 2, 3] <*> [4, 5, 6]
[5,6,7,6,7,8,7,8,9]
The Applicative instance of ZipList applies the operation
by pairing up the elements, analogous to zipWith
N
>>>
(+) <$> ZipList [1, 2, 3] <*> ZipList [4, 5, 6]
ZipList {getZipList = [5,7,9]}
>>>
(,,,) <$> ZipList [1, 2] <*> ZipList [3, 4] <*> ZipList [5, 6] <*> ZipList [7, 8]
ZipList {getZipList = [(1,3,5,7),(2,4,6,8)]}
>>>
ZipList [(+1), (^2), (/ 2)] <*> ZipList [5, 5, 5]
ZipList {getZipList = [6.0,25.0,2.5]}
Constructors
ZipList | |
Fields
|
Instances
NFData1 ZipList | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Alternative ZipList | @since base-4.11.0.0 | ||||
Applicative ZipList | f <$> ZipList xs1 <*> ... <*> ZipList xsN = ZipList (zipWithN f xs1 ... xsN) where (\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..] = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..]) = ZipList {getZipList = ["a5","b6b6","c7c7c7"]} @since base-2.01 | ||||
Functor ZipList | @since base-2.01 | ||||
Foldable ZipList | @since base-4.9.0.0 | ||||
Defined in GHC.Internal.Functor.ZipList Methods fold :: Monoid m => ZipList m -> m # foldMap :: Monoid m => (a -> m) -> ZipList a -> m # foldMap' :: Monoid m => (a -> m) -> ZipList a -> m # foldr :: (a -> b -> b) -> b -> ZipList a -> b # foldr' :: (a -> b -> b) -> b -> ZipList a -> b # foldl :: (b -> a -> b) -> b -> ZipList a -> b # foldl' :: (b -> a -> b) -> b -> ZipList a -> b # foldr1 :: (a -> a -> a) -> ZipList a -> a # foldl1 :: (a -> a -> a) -> ZipList a -> a # elem :: Eq a => a -> ZipList a -> Bool # maximum :: Ord a => ZipList a -> a # minimum :: Ord a => ZipList a -> a # | |||||
Traversable ZipList | @since base-4.9.0.0 | ||||
Generic1 ZipList | |||||
Defined in GHC.Internal.Functor.ZipList Associated Types
| |||||
FoldableWithIndex Int ZipList | |||||
Defined in WithIndex | |||||
FunctorWithIndex Int ZipList | Same instance as for | ||||
TraversableWithIndex Int ZipList | |||||
NFData a => NFData (ZipList a) | Since: deepseq-1.4.0.0 | ||||
Defined in Control.DeepSeq | |||||
Data a => Data (ZipList a) | @since base-4.14.0.0 | ||||
Defined in GHC.Internal.Functor.ZipList Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) # toConstr :: ZipList a -> Constr # dataTypeOf :: ZipList a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) # gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r # gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # | |||||
Generic (ZipList a) | |||||
Defined in GHC.Internal.Functor.ZipList Associated Types
| |||||
IsList (ZipList a) | @since base-4.15.0.0 | ||||
Read a => Read (ZipList a) | @since base-4.7.0.0 | ||||
Show a => Show (ZipList a) | @since base-4.7.0.0 | ||||
Eq a => Eq (ZipList a) | @since base-4.7.0.0 | ||||
Ord a => Ord (ZipList a) | @since base-4.7.0.0 | ||||
AsEmpty (ZipList a) | |||||
Defined in Control.Lens.Empty | |||||
Wrapped (ZipList a) | |||||
MonoFunctor (ZipList a) | |||||
MonoPointed (ZipList a) | |||||
t ~ ZipList b => Rewrapped (ZipList a) t | |||||
Defined in Control.Lens.Wrapped | |||||
Cons (ZipList a) (ZipList b) a b | |||||
Snoc (ZipList a) (ZipList b) a b | |||||
type Rep1 ZipList | @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Functor.ZipList | |||||
type Rep (ZipList a) | @since base-4.7.0.0 | ||||
Defined in GHC.Internal.Functor.ZipList | |||||
type Item (ZipList a) | |||||
Defined in GHC.Internal.IsList | |||||
type Unwrapped (ZipList a) | |||||
Defined in Control.Lens.Wrapped | |||||
type Element (ZipList a) | |||||
Defined in Data.MonoTraversable |
This has everything each log message will contain.
Constructors
Item | |
Fields
|
Instances
Functor Item | |||||
FromJSON a => FromJSON (Item a) | |||||
Defined in Katip.Core | |||||
ToJSON a => ToJSON (Item a) | |||||
Generic (Item a) | |||||
Defined in Katip.Core Associated Types
| |||||
Show a => Show (Item a) | |||||
Eq a => Eq (Item a) | |||||
type Rep (Item a) | |||||
Defined in Katip.Core type Rep (Item a) = D1 ('MetaData "Item" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) (C1 ('MetaCons "Item" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_itemApp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Namespace) :*: S1 ('MetaSel ('Just "_itemEnv") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Environment)) :*: (S1 ('MetaSel ('Just "_itemSeverity") 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Severity) :*: (S1 ('MetaSel ('Just "_itemThread") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ThreadIdText) :*: S1 ('MetaSel ('Just "_itemHost") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 HostName)))) :*: ((S1 ('MetaSel ('Just "_itemProcess") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProcessID) :*: (S1 ('MetaSel ('Just "_itemPayload") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "_itemMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LogStr))) :*: (S1 ('MetaSel ('Just "_itemTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime) :*: (S1 ('MetaSel ('Just "_itemNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Namespace) :*: S1 ('MetaSel ('Just "_itemLoc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Loc))))))) |
newtype WrappedArrow (a :: Type -> Type -> Type) b c #
Constructors
WrapArrow | |
Fields
|
Instances
Generic1 (WrappedArrow a b :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0 # to1 :: Rep1 (WrappedArrow a b) a0 -> WrappedArrow a b a0 # | |||||
(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods empty :: WrappedArrow a b a0 # (<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 # some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # | |||||
Arrow a => Applicative (WrappedArrow a b) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |||||
Arrow a => Functor (WrappedArrow a b) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # (<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |||||
(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c) | Since: base-4.14.0.0 | ||||
Defined in Control.Applicative Methods gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) # toConstr :: WrappedArrow a b c -> Constr # dataTypeOf :: WrappedArrow a b c -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r # gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # | |||||
Generic (WrappedArrow a b c) | |||||
Defined in Control.Applicative Associated Types
Methods from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x # to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c # | |||||
Wrapped (WrappedArrow a b c) | |||||
Defined in Control.Lens.Wrapped Associated Types
Methods _Wrapped' :: Iso' (WrappedArrow a b c) (Unwrapped (WrappedArrow a b c)) # | |||||
Arrow a => MonoFunctor (WrappedArrow a b c) | |||||
Defined in Data.MonoTraversable Methods omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c # | |||||
Arrow a => MonoPointed (WrappedArrow a b c) | |||||
Defined in Data.MonoTraversable Methods opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c # | |||||
t ~ WrappedArrow a' b' c' => Rewrapped (WrappedArrow a b c) t | |||||
Defined in Control.Lens.Wrapped | |||||
type Rep1 (WrappedArrow a b :: Type -> Type) | Since: base-4.7.0.0 | ||||
Defined in Control.Applicative type Rep1 (WrappedArrow a b :: Type -> Type) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (a b)))) | |||||
type Rep (WrappedArrow a b c) | Since: base-4.7.0.0 | ||||
Defined in Control.Applicative type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c)))) | |||||
type Unwrapped (WrappedArrow a b c) | |||||
Defined in Control.Lens.Wrapped | |||||
type Element (WrappedArrow a b c) | |||||
Defined in Data.MonoTraversable |
newtype WrappedMonad (m :: Type -> Type) a #
Constructors
WrapMonad | |
Fields
|
Instances
Generic1 (WrappedMonad m :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedMonad m a -> Rep1 (WrappedMonad m) a # to1 :: Rep1 (WrappedMonad m) a -> WrappedMonad m a # | |||||
MonadPlus m => Alternative (WrappedMonad m) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods empty :: WrappedMonad m a # (<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a # some :: WrappedMonad m a -> WrappedMonad m [a] # many :: WrappedMonad m a -> WrappedMonad m [a] # | |||||
Monad m => Applicative (WrappedMonad m) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |||||
Monad m => Functor (WrappedMonad m) | Since: base-2.1 | ||||
Defined in Control.Applicative Methods fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b # (<$) :: a -> WrappedMonad m b -> WrappedMonad m a # | |||||
Monad m => Monad (WrappedMonad m) | Since: base-4.7.0.0 | ||||
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b # (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # return :: a -> WrappedMonad m a # | |||||
(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a) | Since: base-4.14.0.0 | ||||
Defined in Control.Applicative Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) # toConstr :: WrappedMonad m a -> Constr # dataTypeOf :: WrappedMonad m a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) # gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r # gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u # gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # | |||||
Generic (WrappedMonad m a) | |||||
Defined in Control.Applicative Associated Types
Methods from :: WrappedMonad m a -> Rep (WrappedMonad m a) x # to :: Rep (WrappedMonad m a) x -> WrappedMonad m a # | |||||
Wrapped (WrappedMonad m a) | |||||
Defined in Control.Lens.Wrapped Associated Types
Methods _Wrapped' :: Iso' (WrappedMonad m a) (Unwrapped (WrappedMonad m a)) # | |||||
Monad m => MonoFunctor (WrappedMonad m a) | |||||
Defined in Data.MonoTraversable Methods omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a # | |||||
Monad m => MonoPointed (WrappedMonad m a) | |||||
Defined in Data.MonoTraversable Methods opoint :: Element (WrappedMonad m a) -> WrappedMonad m a # | |||||
t ~ WrappedMonad m' a' => Rewrapped (WrappedMonad m a) t | |||||
Defined in Control.Lens.Wrapped | |||||
type Rep1 (WrappedMonad m :: Type -> Type) | Since: base-4.7.0.0 | ||||
Defined in Control.Applicative type Rep1 (WrappedMonad m :: Type -> Type) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 m))) | |||||
type Rep (WrappedMonad m a) | Since: base-4.7.0.0 | ||||
Defined in Control.Applicative type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a)))) | |||||
type Unwrapped (WrappedMonad m a) | |||||
Defined in Control.Lens.Wrapped | |||||
type Element (WrappedMonad m a) | |||||
Defined in Data.MonoTraversable |
Constructors
SimpleExtern (Ref Function) [SExp] | |
ParensExtern [ParensOperator] | |
ModExtern (Ref Function) [SExp] [FunModifier] | |
Cast SExp Type | |
SafeCast SExp Type | |
ExternRaw Text |
Instances
NFData ExternFun | |||||
Defined in Napkin.Types.Core | |||||
Data ExternFun | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExternFun -> c ExternFun # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExternFun # toConstr :: ExternFun -> Constr # dataTypeOf :: ExternFun -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExternFun) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExternFun) # gmapT :: (forall b. Data b => b -> b) -> ExternFun -> ExternFun # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExternFun -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExternFun -> r # gmapQ :: (forall d. Data d => d -> u) -> ExternFun -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ExternFun -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun # | |||||
Generic ExternFun | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show ExternFun | |||||
Eq ExternFun | |||||
Ord ExternFun | |||||
HasDeps ExternFun | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer ExternFun | |||||
TableRenamer ExternFun | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift ExternFun | |||||
type Rep ExternFun | |||||
Defined in Napkin.Types.Core type Rep ExternFun = D1 ('MetaData "ExternFun" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SimpleExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: (C1 ('MetaCons "ParensExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperator])) :+: C1 ('MetaCons "ModExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FunModifier]))))) :+: (C1 ('MetaCons "Cast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: (C1 ('MetaCons "SafeCast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "ExternRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))) |
Constructors
From (Selected Relation) [(Selected Relation, JoinType, Either (Maybe SExp) [Ref SExp])] |
Instances
NFData From | |||||
Defined in Napkin.Types.Core | |||||
Data From | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> From -> c From # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c From # dataTypeOf :: From -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c From) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c From) # gmapT :: (forall b. Data b => b -> b) -> From -> From # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> From -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> From -> r # gmapQ :: (forall d. Data d => d -> u) -> From -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> From -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> From -> m From # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> From -> m From # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> From -> m From # | |||||
Generic From | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show From | |||||
Eq From | |||||
Ord From | |||||
HasDeps From | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer From | |||||
TableRenamer From | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift From | |||||
type Rep From | |||||
Defined in Napkin.Types.Core type Rep From = D1 ('MetaData "From" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "From" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Relation)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Selected Relation, JoinType, Either (Maybe SExp) [Ref SExp])]))) |
Common case of a string column possibly being empty either by being a blank string or properly being NULL.
data InsertStatement #
Constructors
Insert | |
Fields
|
Instances
Generic InsertStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Associated Types
Methods from :: InsertStatement -> Rep InsertStatement x # to :: Rep InsertStatement x -> InsertStatement # | |||||
Show InsertStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> InsertStatement -> ShowS # show :: InsertStatement -> String # showList :: [InsertStatement] -> ShowS # | |||||
Eq InsertStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: InsertStatement -> InsertStatement -> Bool # (/=) :: InsertStatement -> InsertStatement -> Bool # | |||||
Stateable InsertStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods toStatement :: InsertStatement -> Statement # fromStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Statement -> Sem r InsertStatement # | |||||
type Rep InsertStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse type Rep InsertStatement = D1 ('MetaData "InsertStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Insert" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: (S1 ('MetaSel ('Just "columnNames") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Name])) :*: S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InsertSource)))) |
data External (m :: k) a where #
Constructors
ExecuteExternalCommand' :: forall {k} (m :: k). ExternalCommand -> External m (Either Text ExitCode) |
external :: forall {k} (b :: k) (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type] r => Set (Ref Table) -> ExternalCommand -> Sem r () #
Instances
Data Table | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Table -> c Table # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Table # dataTypeOf :: Table -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Table) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Table) # gmapT :: (forall b. Data b => b -> b) -> Table -> Table # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r # gmapQ :: (forall d. Data d => d -> u) -> Table -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Table -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Table -> m Table # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table # | |
TableRenamer (Alias Table) | |
TableRenamer (Selected Table) | |
TableRef (Ref Table) | |
HasDeps (Ref Table) | |
Defined in Napkin.Types.Deps | |
TableRenamer (Ref Table) | |
A class for types with a default value.
Minimal complete definition
Nothing
Methods
The default value for this type.
Instances
Default All | |
Defined in Data.Default.Class | |
Default Any | |
Defined in Data.Default.Class | |
Default CClock | |
Defined in Data.Default.Class | |
Default CDouble | |
Defined in Data.Default.Class | |
Default CFloat | |
Defined in Data.Default.Class | |
Default CInt | |
Defined in Data.Default.Class | |
Default CIntMax | |
Defined in Data.Default.Class | |
Default CIntPtr | |
Defined in Data.Default.Class | |
Default CLLong | |
Defined in Data.Default.Class | |
Default CLong | |
Defined in Data.Default.Class | |
Default CPtrdiff | |
Defined in Data.Default.Class | |
Default CSUSeconds | |
Defined in Data.Default.Class Methods def :: CSUSeconds # | |
Default CShort | |
Defined in Data.Default.Class | |
Default CSigAtomic | |
Defined in Data.Default.Class Methods def :: CSigAtomic # | |
Default CSize | |
Defined in Data.Default.Class | |
Default CTime | |
Defined in Data.Default.Class | |
Default CUInt | |
Defined in Data.Default.Class | |
Default CUIntMax | |
Defined in Data.Default.Class | |
Default CUIntPtr | |
Defined in Data.Default.Class | |
Default CULLong | |
Defined in Data.Default.Class | |
Default CULong | |
Defined in Data.Default.Class | |
Default CUSeconds | |
Defined in Data.Default.Class | |
Default CUShort | |
Defined in Data.Default.Class | |
Default Int16 | |
Defined in Data.Default.Class | |
Default Int32 | |
Defined in Data.Default.Class | |
Default Int64 | |
Defined in Data.Default.Class | |
Default Int8 | |
Defined in Data.Default.Class | |
Default Word16 | |
Defined in Data.Default.Class | |
Default Word32 | |
Defined in Data.Default.Class | |
Default Word64 | |
Defined in Data.Default.Class | |
Default Word8 | |
Defined in Data.Default.Class | |
Default Ordering | |
Defined in Data.Default.Class | |
Default OAuth2 | |
Defined in Network.OAuth.OAuth2.Internal | |
Default MaterializedViewMeta | |
Defined in Napkin.Types.BigQuery Methods | |
Default TableMeta | |
Defined in Napkin.Types.BigQuery | |
Default TimePartitioning | |
Defined in Napkin.Types.BigQuery Methods def :: TimePartitioning # | |
Default ViewMeta | |
Defined in Napkin.Types.BigQuery | |
Default SubQueryTransformState | |
Defined in Napkin.Untyped.Ops.BigQuery Methods | |
Default MaterializedViewMeta | |
Defined in Napkin.Types.Postgres Methods | |
Default TableMeta | |
Defined in Napkin.Types.Postgres | |
Default ContinuousViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods | |
Default TimescaleViewMeta | |
Defined in Napkin.Types.Postgres.Timescale Methods | |
Default DistStyle | |
Defined in Napkin.Types.Redshift | |
Default SortStyle | |
Defined in Napkin.Types.Redshift | |
Default TableMeta | |
Defined in Napkin.Types.Redshift | |
Default Distinctness | |
Defined in Napkin.Types.Core Methods def :: Distinctness # | |
Default WOver | |
Defined in Napkin.Types.Core | |
Default WithClauses | |
Defined in Napkin.Types.Core Methods def :: WithClauses # | |
Default SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods | |
Default AssertionGroup | |
Defined in Napkin.Run.Effects.Languages.Assertion Methods def :: AssertionGroup # | |
Default InsertColumnsList | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods | |
Default ExtraDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods | |
Default HiddenArtifacts | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods def :: HiddenArtifacts # | |
Default HiddenDependencies | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods | |
Default CustomValidator | |
Defined in Napkin.Spec.Types.Spec Methods def :: CustomValidator # | |
Default Options | |
Defined in Web.Scotty.Internal.Types | |
Default RouteOptions | |
Defined in Web.Scotty.Internal.Types Methods def :: RouteOptions # | |
Default ScottyResponse | |
Defined in Web.Scotty.Internal.Types Methods def :: ScottyResponse # | |
Default Integer | |
Defined in Data.Default.Class | |
Default () | |
Defined in Data.Default.Class | |
Default Double | |
Defined in Data.Default.Class | |
Default Float | |
Defined in Data.Default.Class | |
Default Int | |
Defined in Data.Default.Class | |
Default Word | |
Defined in Data.Default.Class | |
(Default a, RealFloat a) => Default (Complex a) | |
Defined in Data.Default.Class | |
Default (First a) | |
Defined in Data.Default.Class | |
Default (Last a) | |
Defined in Data.Default.Class | |
Default a => Default (Dual a) | |
Defined in Data.Default.Class | |
Default (Endo a) | |
Defined in Data.Default.Class | |
Num a => Default (Product a) | |
Defined in Data.Default.Class | |
Num a => Default (Sum a) | |
Defined in Data.Default.Class | |
Integral a => Default (Ratio a) | |
Defined in Data.Default.Class | |
Default a => Default (IO a) | |
Defined in Data.Default.Class | |
Default (BoolOrOpts a) | |
Defined in Napkin.Types.Postgres.Timescale Methods def :: BoolOrOpts a # | |
Default a => Default (ContinuousAggregatePolicy' a) | |
Defined in Napkin.Types.Postgres.Timescale Methods | |
Default (ResultCache a) | |
Defined in Polysemy.Memoize Methods def :: ResultCache a # | |
Default (Specs b) | |
Defined in Napkin.Spec.Types.Spec | |
Default (Maybe a) | |
Defined in Data.Default.Class | |
Default [a] | |
Defined in Data.Default.Class | |
(Default a, Default b) => Default (a, b) | |
Defined in Data.Default.Class | |
Default r => Default (e -> r) | |
Defined in Data.Default.Class | |
(Default a, Default b, Default c) => Default (a, b, c) | |
Defined in Data.Default.Class | |
(Default a, Default b, Default c, Default d) => Default (a, b, c, d) | |
Defined in Data.Default.Class | |
(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) | |
Defined in Data.Default.Class | |
(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) | |
Defined in Data.Default.Class | |
(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) | |
Defined in Data.Default.Class |
This is a length of time, as measured by a clock.
Conversion functions such as fromInteger
and realToFrac
will treat it as seconds.
For example, (0.010 :: DiffTime)
corresponds to 10 milliseconds.
It has a precision of one picosecond (= 10^-12 s). Enumeration functions will treat it as picoseconds.
Instances
FromJSON DiffTime | This instance includes a bounds check to prevent maliciously
large inputs to fill up the memory of the target system. You can
newtype |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON DiffTime | |
NFData DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Buildable DiffTime | |
Defined in Formatting.Buildable | |
Data DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime # toConstr :: DiffTime -> Constr # dataTypeOf :: DiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) # gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # | |
Enum DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Num DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Read DiffTime | |
Fractional DiffTime | |
Real DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods toRational :: DiffTime -> Rational # | |
RealFrac DiffTime | |
Show DiffTime | |
Eq DiffTime | |
Ord DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime |
dropView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #
data TimeLocale #
Constructors
TimeLocale | |
Fields
|
Instances
Show TimeLocale | |
Defined in Data.Time.Format.Locale Methods showsPrec :: Int -> TimeLocale -> ShowS # show :: TimeLocale -> String # showList :: [TimeLocale] -> ShowS # | |
Eq TimeLocale | |
Defined in Data.Time.Format.Locale | |
Ord TimeLocale | |
Defined in Data.Time.Format.Locale Methods compare :: TimeLocale -> TimeLocale -> Ordering # (<) :: TimeLocale -> TimeLocale -> Bool # (<=) :: TimeLocale -> TimeLocale -> Bool # (>) :: TimeLocale -> TimeLocale -> Bool # (>=) :: TimeLocale -> TimeLocale -> Bool # max :: TimeLocale -> TimeLocale -> TimeLocale # min :: TimeLocale -> TimeLocale -> TimeLocale # |
data CreateTableDDL #
Constructors
CreateTableDDL | |
Fields
|
Instances
Generic CreateTableDDL | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Associated Types
Methods from :: CreateTableDDL -> Rep CreateTableDDL x # to :: Rep CreateTableDDL x -> CreateTableDDL # | |||||
Show CreateTableDDL | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> CreateTableDDL -> ShowS # show :: CreateTableDDL -> String # showList :: [CreateTableDDL] -> ShowS # | |||||
Eq CreateTableDDL | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: CreateTableDDL -> CreateTableDDL -> Bool # (/=) :: CreateTableDDL -> CreateTableDDL -> Bool # | |||||
Stateable CreateTableDDL | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods toStatement :: CreateTableDDL -> Statement # fromStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Statement -> Sem r CreateTableDDL # refTableLens :: Lens' CreateTableDDL (Ref Table) # | |||||
type Rep CreateTableDDL | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse type Rep CreateTableDDL = D1 ('MetaData "CreateTableDDL" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "CreateTableDDL" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: S1 ('MetaSel ('Just "columns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TableElement]))) |
substitute :: forall (r :: EffectRow). Member (Template :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> SqlTemplateVariables -> Sem r (Either TemplateError Text) #
Log message with Builder underneath; use <>
to concat in O(1).
Instances
FromJSON LogStr | |||||
Defined in Katip.Core | |||||
Monoid LogStr | |||||
Semigroup LogStr | |||||
IsString LogStr | |||||
Defined in Katip.Core Methods fromString :: String -> LogStr # | |||||
Generic LogStr | |||||
Defined in Katip.Core Associated Types
| |||||
Show LogStr | |||||
Eq LogStr | |||||
type Rep LogStr | |||||
Defined in Katip.Core |
data NominalDiffTime #
This is a length of time, as measured by UTC. It has a precision of 10^-12 s.
Conversion functions such as fromInteger
and realToFrac
will treat it as seconds.
For example, (0.010 :: NominalDiffTime)
corresponds to 10 milliseconds.
It has a precision of one picosecond (= 10^-12 s). Enumeration functions will treat it as picoseconds.
It ignores leap-seconds, so it's not necessarily a fixed amount of clock time. For instance, 23:00 UTC + 2 hours of NominalDiffTime = 01:00 UTC (+ 1 day), regardless of whether a leap-second intervened.
Instances
FromJSON NominalDiffTime | This instance includes a bounds check to prevent maliciously
large inputs to fill up the memory of the target system. You can
newtype |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser NominalDiffTime # parseJSONList :: Value -> Parser [NominalDiffTime] # | |
ToJSON NominalDiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: NominalDiffTime -> Value # toEncoding :: NominalDiffTime -> Encoding # toJSONList :: [NominalDiffTime] -> Value # toEncodingList :: [NominalDiffTime] -> Encoding # omitField :: NominalDiffTime -> Bool # | |
NFData NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods rnf :: NominalDiffTime -> () # | |
Buildable NominalDiffTime | |
Defined in Formatting.Buildable Methods build :: NominalDiffTime -> Builder # | |
Data NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NominalDiffTime -> c NominalDiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NominalDiffTime # toConstr :: NominalDiffTime -> Constr # dataTypeOf :: NominalDiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NominalDiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NominalDiffTime) # gmapT :: (forall b. Data b => b -> b) -> NominalDiffTime -> NominalDiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> NominalDiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NominalDiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # | |
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] # | |
Num NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (+) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (-) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (*) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # negate :: NominalDiffTime -> NominalDiffTime # abs :: NominalDiffTime -> NominalDiffTime # signum :: NominalDiffTime -> NominalDiffTime # fromInteger :: Integer -> NominalDiffTime # | |
Read NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods readsPrec :: Int -> ReadS NominalDiffTime # readList :: ReadS [NominalDiffTime] # | |
Fractional NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (/) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # recip :: NominalDiffTime -> NominalDiffTime # fromRational :: Rational -> NominalDiffTime # | |
Real NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods toRational :: NominalDiffTime -> Rational # | |
RealFrac NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods properFraction :: Integral b => NominalDiffTime -> (b, NominalDiffTime) # truncate :: Integral b => NominalDiffTime -> b # round :: Integral b => NominalDiffTime -> b # ceiling :: Integral b => NominalDiffTime -> b # floor :: Integral b => NominalDiffTime -> b # | |
Show NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods showsPrec :: Int -> NominalDiffTime -> ShowS # show :: NominalDiffTime -> String # showList :: [NominalDiffTime] -> ShowS # | |
Eq NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods (==) :: NominalDiffTime -> NominalDiffTime -> Bool # (/=) :: NominalDiffTime -> NominalDiffTime -> Bool # | |
Ord NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods compare :: NominalDiffTime -> NominalDiffTime -> Ordering # (<) :: NominalDiffTime -> NominalDiffTime -> Bool # (<=) :: NominalDiffTime -> NominalDiffTime -> Bool # (>) :: NominalDiffTime -> NominalDiffTime -> Bool # (>=) :: NominalDiffTime -> NominalDiffTime -> Bool # max :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # min :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # | |
FromFormKey NominalDiffTime | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text NominalDiffTime # | |
ToFormKey NominalDiffTime | |
Defined in Web.Internal.FormUrlEncoded Methods toFormKey :: NominalDiffTime -> Text # |
data Annotation #
Constructors
TableAnnotation Text | |
ColumnsAnnotations (Map (Ref SExp) Text) |
assertM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r AssertionStatus -> Sem r () #
Constructors
DebugS | Debug messages |
InfoS | Information |
NoticeS | Normal runtime Conditions |
WarningS | General Warnings |
ErrorS | General Errors |
CriticalS | Severe situations |
AlertS | Take immediate action |
EmergencyS | System is unusable |
Instances
FromJSON Severity | |||||
Defined in Katip.Core | |||||
ToJSON Severity | |||||
Bounded Severity | |||||
Enum Severity | |||||
Generic Severity | |||||
Defined in Katip.Core Associated Types
| |||||
Read Severity | |||||
Show Severity | |||||
Eq Severity | |||||
Ord Severity | |||||
Defined in Katip.Core | |||||
Lift Severity | |||||
type Rep Severity | |||||
Defined in Katip.Core type Rep Severity = D1 ('MetaData "Severity" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) (((C1 ('MetaCons "DebugS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InfoS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NoticeS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WarningS" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrorS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CriticalS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlertS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmergencyS" 'PrefixI 'False) (U1 :: Type -> Type)))) |
logMsg :: (Applicative m, Katip m) => Namespace -> Severity -> LogStr -> m () #
Log a message without any payload/context or code location.
logInfo :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
Minimal complete definition
backendConnectionString, backendExecute, backendQuery, backendCheckTableExists, backendGetTableKind, backendGetRelationSchema, backendGetAnnotations, backendAnnotate, backendDrop, backendRename, backendListTables, backendNormalize
Methods
backendConnectionString :: BackendConn b -> ConnectionString #
backendExecute :: (MonadNapkin b m, RenderSql command b) => BackendConn b -> command -> m () #
backendQuery :: (MonadNapkin b m, RenderSql q b) => BackendConn b -> q -> m [Map Text Value] #
backendCheckTableExists :: MonadNapkin b m => BackendConn b -> Ref Table -> m Bool #
backendGetTableKind :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableKind #
backendGetRelationSchema :: MonadNapkin b m => BackendConn b -> Ref Table -> Relation -> m [BackendSchemaField b] #
backendGetAnnotations :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableAnnotations #
backendAnnotate :: MonadNapkin b m => BackendConn b -> Ref Table -> Annotation -> m () #
backendCreateAs :: (MonadNapkin b m, RenderSql command b, command ~ CreateRelation b) => BackendConn b -> command -> m () #
backendCreate :: (MonadNapkin b m, RenderSql command b, command ~ CreateTableSchema b) => BackendConn b -> command -> m () #
backendCopyTable :: (Default (BackendMeta 'KindTable b), MonadNapkin b m, RenderSql (CreateRelation b) b, RenderSql DeleteRows b, RenderSql InsertInto b) => BackendConn b -> Ref Table -> Ref Table -> TableWriteStrategy -> m () #
backendDrop :: MonadNapkin b m => BackendConn b -> DropRelation -> m () #
backendInsertInto :: (MonadNapkin b m, RenderSql command b, command ~ InsertInto) => BackendConn b -> command -> m () #
backendRename :: MonadNapkin b m => BackendConn b -> RenameRelation -> m () #
backendListTables :: MonadNapkin b m => BackendConn b -> ListTables -> m (Set ListedTable) #
backendNormalize :: MonadNapkin b m => BackendConn b -> NormalizeTableNames -> m (Map (Ref Table) NormalizedTable) #
backendAddColumn :: (MonadNapkin b m, RenderSql command b, command ~ AddColumnToTable) => BackendConn b -> command -> m () #
backendDropColumn :: (MonadNapkin b m, RenderSql command b, command ~ DropColumnFromTable) => BackendConn b -> command -> m () #
data CompareCount #
Instances
Show CompareCount # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods showsPrec :: Int -> CompareCount -> ShowS # show :: CompareCount -> String # showList :: [CompareCount] -> ShowS # | |
Eq CompareCount # | |
Defined in Napkin.Run.Effects.Hooks.Types |
addDependency :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r () #
Add the given reference to list of dependency for the underlying region.
Later during interpretation, this will cause the given dependency to be forcefully considered upstream dependency within the enclosed region even though they were not seen in the parsed SQL.
Like selected, but aliasing is optional
Constructors
Alias | |
Fields
|
Instances
Foldable Alias | |||||
Defined in Napkin.Types.Core Methods fold :: Monoid m => Alias m -> m # foldMap :: Monoid m => (a -> m) -> Alias a -> m # foldMap' :: Monoid m => (a -> m) -> Alias a -> m # foldr :: (a -> b -> b) -> b -> Alias a -> b # foldr' :: (a -> b -> b) -> b -> Alias a -> b # foldl :: (b -> a -> b) -> b -> Alias a -> b # foldl' :: (b -> a -> b) -> b -> Alias a -> b # foldr1 :: (a -> a -> a) -> Alias a -> a # foldl1 :: (a -> a -> a) -> Alias a -> a # elem :: Eq a => a -> Alias a -> Bool # maximum :: Ord a => Alias a -> a # minimum :: Ord a => Alias a -> a # | |||||
WithName Alias | |||||
Defined in Napkin.Types.Core | |||||
Lift a => Lift (Alias a :: Type) | |||||
NFData a => NFData (Alias a) | |||||
Defined in Napkin.Types.Core | |||||
Data a => Data (Alias a) | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alias a -> c (Alias a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alias a) # toConstr :: Alias a -> Constr # dataTypeOf :: Alias a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alias a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alias a)) # gmapT :: (forall b. Data b => b -> b) -> Alias a -> Alias a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alias a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alias a -> r # gmapQ :: (forall d. Data d => d -> u) -> Alias a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Alias a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) # | |||||
Generic (Alias a) | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show a => Show (Alias a) | |||||
Eq a => Eq (Alias a) | |||||
Ord a => Ord (Alias a) | |||||
HasDeps (Alias SExp) | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer (Alias SExp) | |||||
TableRenamer (Alias SExp) | |||||
TableRenamer (Alias Table) | |||||
type Rep (Alias a) | |||||
Defined in Napkin.Types.Core type Rep (Alias a) = D1 ('MetaData "Alias" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Alias" 'PrefixI 'True) (S1 ('MetaSel ('Just "_aliasRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Ref a))) :*: S1 ('MetaSel ('Just "_aliasItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
getAnnotations :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableAnnotations #
Instances
Val ByteString | |
Defined in Napkin.Types.Core Methods val :: Prism' Value ByteString # | |
Val Int64 | Auto-convert from |
Val DatePart | |
Val IntInterval | |
Defined in Napkin.Types.Core Methods val :: Prism' Value IntInterval # | |
Val Value | |
Val Text | |
Val Day | |
Val UTCTime | |
Val Integer | |
Val String | |
Val Bool | |
Val Double | |
Val Int | |
Val a => Val (Maybe a) | |
Instances
Data QState | |||||
Defined in Napkin.Untyped.Monad Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QState -> c QState # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QState # toConstr :: QState -> Constr # dataTypeOf :: QState -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QState) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QState) # gmapT :: (forall b. Data b => b -> b) -> QState -> QState # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QState -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QState -> r # gmapQ :: (forall d. Data d => d -> u) -> QState -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> QState -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> QState -> m QState # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QState -> m QState # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QState -> m QState # | |||||
Generic QState | |||||
Defined in Napkin.Untyped.Monad Associated Types
| |||||
Show QState | |||||
Eq QState | |||||
HasRefStore QState | |||||
MonadState QState Q | |||||
type Rep QState | |||||
Defined in Napkin.Untyped.Monad type Rep QState = D1 ('MetaData "QState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "QState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query))) |
logError :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logDebug :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
Constructors
UState | |
Fields
|
Instances
Data UState | |||||
Defined in Napkin.Untyped.Monad Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UState -> c UState # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UState # toConstr :: UState -> Constr # dataTypeOf :: UState -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UState) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UState) # gmapT :: (forall b. Data b => b -> b) -> UState -> UState # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UState -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UState -> r # gmapQ :: (forall d. Data d => d -> u) -> UState -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UState -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UState -> m UState # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UState -> m UState # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UState -> m UState # | |||||
Generic UState | |||||
Defined in Napkin.Untyped.Monad Associated Types
| |||||
Show UState | |||||
Eq UState | |||||
HasRefStore UState | |||||
MonadState UState U | |||||
type Rep UState | |||||
Defined in Napkin.Untyped.Monad type Rep UState = D1 ('MetaData "UState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "UState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UpdateQuery))) |
data SqlParseError #
Constructors
SqlParseError | |
Fields
|
Instances
Show SqlParseError | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods showsPrec :: Int -> SqlParseError -> ShowS # show :: SqlParseError -> String # showList :: [SqlParseError] -> ShowS # | |
Eq SqlParseError | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods (==) :: SqlParseError -> SqlParseError -> Bool # (/=) :: SqlParseError -> SqlParseError -> Bool # |
interval :: [(Double, DatePart)] -> SExp #
Shorthand for using literal Doubles in making interval expressions.
data AssertionEntry #
Constructors
AssertionEntry | |
Fields |
Instances
Generic AssertionEntry | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Associated Types
Methods from :: AssertionEntry -> Rep AssertionEntry x # to :: Rep AssertionEntry x -> AssertionEntry # | |||||
Show AssertionEntry | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionEntry -> ShowS # show :: AssertionEntry -> String # showList :: [AssertionEntry] -> ShowS # | |||||
Eq AssertionEntry | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionEntry -> AssertionEntry -> Bool # (/=) :: AssertionEntry -> AssertionEntry -> Bool # | |||||
type Rep AssertionEntry | |||||
Defined in Napkin.Run.Effects.Languages.Assertion type Rep AssertionEntry = D1 ('MetaData "AssertionEntry" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "AssertionEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "assertionGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionGroup) :*: S1 ('MetaSel ('Just "message") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "status") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionStatus) :*: S1 ('MetaSel ('Just "severity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionSeverity)))) |
The Modified Julian Day is a standard count of days, with zero being the day 1858-11-17.
Constructors
ModifiedJulianDay | |
Fields |
Instances
FromJSON Day | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Day | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Day | |
ToJSONKey Day | |
Defined in Data.Aeson.Types.ToJSON | |
NFData Day | |
Defined in Data.Time.Calendar.Days | |
Buildable Day | |
Defined in Formatting.Buildable | |
Data Day | |
Defined in Data.Time.Calendar.Days Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day # dataTypeOf :: Day -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) # gmapT :: (forall b. Data b => b -> b) -> Day -> Day # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r # gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day # | |
Enum Day | |
Ix Day | |
Eq Day | |
Ord Day | |
FromFormKey Day | |
Defined in Web.Internal.FormUrlEncoded | |
ToFormKey Day | |
Defined in Web.Internal.FormUrlEncoded | |
Val Day | |
ToSql Day | Corresponds to DATE type of SQL Server. |
Defined in Database.ODBC.SQLServer | |
DayPeriod Day | |
Defined in Data.Time.Calendar.Days | |
ISO8601 Day |
|
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format Day # |
Time of day as represented in hour, minute and second (with picoseconds), typically used to express local time of day.
TimeOfDay 24 0 0
is considered invalid for the purposes of makeTimeOfDayValid
, as well as reading and parsing,
but valid for ISO 8601 parsing in Data.Time.Format.ISO8601.
Constructors
TimeOfDay | |
Instances
FromJSON TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON Methods | |
ToJSON TimeOfDay | |
ToJSONKey TimeOfDay | |
Defined in Data.Aeson.Types.ToJSON | |
NFData TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
Buildable TimeOfDay | |
Defined in Formatting.Buildable | |
Data TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay # toConstr :: TimeOfDay -> Constr # dataTypeOf :: TimeOfDay -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) # gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r # gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # | |
Show TimeOfDay | |
Eq TimeOfDay | |
Ord TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
ToSql TimeOfDay | Corresponds to TIME type of SQL Server.
|
Defined in Database.ODBC.SQLServer | |
ISO8601 TimeOfDay |
|
Defined in Data.Time.Format.ISO8601 Methods |
Represents a heirarchy of namespaces going from general to specific. For instance: ["processname", "subsystem"]. Note that single-segment namespaces can be created using IsString/OverloadedStrings, so "foo" will result in Namespace ["foo"].
Constructors
Namespace | |
Fields
|
Instances
FromJSON Namespace | |||||
Defined in Katip.Core | |||||
ToJSON Namespace | |||||
Monoid Namespace | |||||
Semigroup Namespace | |||||
IsString Namespace | |||||
Defined in Katip.Core Methods fromString :: String -> Namespace # | |||||
Generic Namespace | |||||
Defined in Katip.Core Associated Types
| |||||
Read Namespace | |||||
Show Namespace | |||||
Eq Namespace | |||||
Ord Namespace | |||||
Lift Namespace | |||||
type Rep Namespace | |||||
Defined in Katip.Core |
Instances
FromJSON DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON Methods | |
ToJSON DayOfWeek | |
ToJSONKey DayOfWeek | |
Defined in Data.Aeson.Types.ToJSON | |
NFData DayOfWeek | |
Defined in Data.Time.Calendar.Week | |
Data DayOfWeek | |
Defined in Data.Time.Calendar.Week Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek # toConstr :: DayOfWeek -> Constr # dataTypeOf :: DayOfWeek -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) # gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r # gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # | |
Enum DayOfWeek | "Circular", so for example |
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] # | |
Ix DayOfWeek | |
Defined in Data.Time.Calendar.Week Methods range :: (DayOfWeek, DayOfWeek) -> [DayOfWeek] # index :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Int # unsafeIndex :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Int # inRange :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Bool # rangeSize :: (DayOfWeek, DayOfWeek) -> Int # unsafeRangeSize :: (DayOfWeek, DayOfWeek) -> Int # | |
Read DayOfWeek | |
Show DayOfWeek | |
Eq DayOfWeek | |
Ord DayOfWeek | |
pattern January :: MonthOfYear #
pattern February :: MonthOfYear #
pattern March :: MonthOfYear #
pattern April :: MonthOfYear #
pattern May :: MonthOfYear #
pattern June :: MonthOfYear #
pattern July :: MonthOfYear #
pattern August :: MonthOfYear #
pattern September :: MonthOfYear #
pattern October :: MonthOfYear #
pattern November :: MonthOfYear #
pattern December :: MonthOfYear #
The twelve MonthOfYear
patterns form a COMPLETE
set.
isLeapYear :: Year -> Bool #
Is this year a leap year according to the proleptic Gregorian calendar?
A simple day and time aggregate, where the day is of the specified parameter, and the time is a TimeOfDay. Conversion of this (as local civil time) to UTC depends on the time zone. Conversion of this (as local mean time) to UT1 depends on the longitude.
Constructors
LocalTime | |
Fields
|
Instances
FromJSON LocalTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey LocalTime | |
Defined in Data.Aeson.Types.FromJSON Methods | |
ToJSON LocalTime | |
ToJSONKey LocalTime | |
Defined in Data.Aeson.Types.ToJSON | |
NFData LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
Buildable LocalTime | |
Defined in Formatting.Buildable | |
Data LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime # toConstr :: LocalTime -> Constr # dataTypeOf :: LocalTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) # gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r # gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # | |
Show LocalTime | |
Eq LocalTime | |
Ord LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
FromFormKey LocalTime | |
Defined in Web.Internal.FormUrlEncoded | |
ToFormKey LocalTime | |
Defined in Web.Internal.FormUrlEncoded | |
(TypeError ('Text "Instance for LocalTime is disabled:" ':$$: 'Text "Wrap your value in either (Datetime2 foo) or (Smalldatetime foo).") :: Constraint) => ToSql LocalTime | You cannot use this instance. Wrap your value in either
|
Defined in Database.ODBC.SQLServer | |
ISO8601 LocalTime |
|
Defined in Data.Time.Format.ISO8601 Methods |
data SpecDependency #
Constructors
Managed SpecTableName | |
UnManaged (Ref Table) |
Instances
Show SpecDependency | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> SpecDependency -> ShowS # show :: SpecDependency -> String # showList :: [SpecDependency] -> ShowS # | |
Eq SpecDependency | |
Defined in Napkin.Types.Core Methods (==) :: SpecDependency -> SpecDependency -> Bool # (/=) :: SpecDependency -> SpecDependency -> Bool # | |
Ord SpecDependency | |
Defined in Napkin.Types.Core Methods compare :: SpecDependency -> SpecDependency -> Ordering # (<) :: SpecDependency -> SpecDependency -> Bool # (<=) :: SpecDependency -> SpecDependency -> Bool # (>) :: SpecDependency -> SpecDependency -> Bool # (>=) :: SpecDependency -> SpecDependency -> Bool # max :: SpecDependency -> SpecDependency -> SpecDependency # min :: SpecDependency -> SpecDependency -> SpecDependency # |
renderQuery :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => Query -> Sem r SqlText #
newtype ThreadIdText #
Constructors
ThreadIdText | |
Fields |
Instances
FromJSON ThreadIdText | |
Defined in Katip.Core | |
ToJSON ThreadIdText | |
Defined in Katip.Core Methods toJSON :: ThreadIdText -> Value # toEncoding :: ThreadIdText -> Encoding # toJSONList :: [ThreadIdText] -> Value # toEncodingList :: [ThreadIdText] -> Encoding # omitField :: ThreadIdText -> Bool # | |
Show ThreadIdText | |
Defined in Katip.Core Methods showsPrec :: Int -> ThreadIdText -> ShowS # show :: ThreadIdText -> String # showList :: [ThreadIdText] -> ShowS # | |
Eq ThreadIdText | |
Defined in Katip.Core | |
Ord ThreadIdText | |
Defined in Katip.Core Methods compare :: ThreadIdText -> ThreadIdText -> Ordering # (<) :: ThreadIdText -> ThreadIdText -> Bool # (<=) :: ThreadIdText -> ThreadIdText -> Bool # (>) :: ThreadIdText -> ThreadIdText -> Bool # (>=) :: ThreadIdText -> ThreadIdText -> Bool # max :: ThreadIdText -> ThreadIdText -> ThreadIdText # min :: ThreadIdText -> ThreadIdText -> ThreadIdText # |
renderSeverity :: Severity -> Text #
textToSeverity :: Text -> Maybe Severity #
logStr :: StringConv a Text => a -> LogStr #
Constructors
LogEnv | |
Fields
|
Constructors
Scribe | |
Fields
|
type PermitFunc = forall a. Item a -> IO Bool #
Scribes are handlers of incoming items. Each registered scribe knows how to push a log item somewhere.
Guidelines for writing your own Scribe
Scribes should always take a Severity
and Verbosity
.
Severity is used to exclude log messages that are lower than
the provided Severity. For instance, if the user passes InfoS,
DebugS items should be ignored. Katip provides the permitItem
utility for this. The user or the scribe may use permitAND
and
permitOR
to further customize this filtering, even dynamically if
they wish to.
Verbosity is used to select keys from the log item's payload. Each
LogItem
instance describes what keys should be retained for each
Verbosity level. Use the payloadObject
utility for extracting the keys
that should be written.
Scribes provide a finalizer IO action (scribeFinalizer
) that is
meant to synchronously flush any remaining writes and clean up any
resources acquired when the scribe was created. Internally, katip
keeps a buffer for each scribe's writes. When closeScribe
or
closeScribes
is called, that buffer stops accepting new log
messages and after the last item in its buffer is sent to liPush
,
calls the finalizer. Thus, when the finalizer returns, katip can
assume that all resources are cleaned up and all log messages are
durably written.
While katip internally buffers messages per ScribeSettings
, it
sends them one at a time to the scribe. Depending on the scribe
itself, it may make sense for that scribe to keep its own internal
buffer to batch-send logs if writing items one at a time is not
efficient. The scribe implementer must be sure that on
finalization, all writes are committed synchronously.
Signature of a function passed to Scribe
constructor and
mkScribe* functions that decides which messages to be
logged. Typically filters based on Severity
, but can be
combined with other, custom logic with permitAND
and permitOR
data SimpleLogPayload #
Instances
ToJSON SimpleLogPayload | A built-in convenience log payload that won't log anything on Construct using |
Defined in Katip.Core Methods toJSON :: SimpleLogPayload -> Value # toEncoding :: SimpleLogPayload -> Encoding # toJSONList :: [SimpleLogPayload] -> Value # toEncodingList :: [SimpleLogPayload] -> Encoding # omitField :: SimpleLogPayload -> Bool # | |
Monoid SimpleLogPayload | |
Defined in Katip.Core Methods mappend :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload # mconcat :: [SimpleLogPayload] -> SimpleLogPayload # | |
Semigroup SimpleLogPayload | |
Defined in Katip.Core Methods (<>) :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload # sconcat :: NonEmpty SimpleLogPayload -> SimpleLogPayload # stimes :: Integral b => b -> SimpleLogPayload -> SimpleLogPayload # | |
LogItem SimpleLogPayload | |
Defined in Katip.Core Methods payloadKeys :: Verbosity -> SimpleLogPayload -> PayloadSelection # | |
ToObject SimpleLogPayload | |
Defined in Katip.Core Methods toObject :: SimpleLogPayload -> Object # |
type LogItem = SimpleLogPayload #
payloadKeys :: LogItem a => Verbosity -> a -> PayloadSelection #
List of keys in the JSON object that should be included in message.
Katip requires JSON objects to be logged as context. This
typeclass provides a default instance which uses ToJSON and
produces an empty object if toJSON
results in any type other than
object. If you have a type you want to log that produces an Array
or Number for example, you'll want to write an explicit instance
here. You can trivially add a ToObject instance for something with
a ToJSON instance like:
instance ToObject Foo
Minimal complete definition
Nothing
Instances
ToObject Object | |
Defined in Katip.Core | |
ToObject SimpleLogPayload | |
Defined in Katip.Core Methods toObject :: SimpleLogPayload -> Object # | |
ToObject LogContexts | |
Defined in Katip.Monadic Methods toObject :: LogContexts -> Object # | |
ToObject () | |
Defined in Katip.Core | |
ToObject (TableSpec b) | |
Defined in Napkin.Spec.Types.Spec |
data PayloadSelection #
Field selector by verbosity within JSON payload.
Instances
Monoid PayloadSelection | |
Defined in Katip.Core Methods mappend :: PayloadSelection -> PayloadSelection -> PayloadSelection # mconcat :: [PayloadSelection] -> PayloadSelection # | |
Semigroup PayloadSelection | |
Defined in Katip.Core Methods (<>) :: PayloadSelection -> PayloadSelection -> PayloadSelection # sconcat :: NonEmpty PayloadSelection -> PayloadSelection # stimes :: Integral b => b -> PayloadSelection -> PayloadSelection # | |
Show PayloadSelection | |
Defined in Katip.Core Methods showsPrec :: Int -> PayloadSelection -> ShowS # show :: PayloadSelection -> String # showList :: [PayloadSelection] -> ShowS # | |
Eq PayloadSelection | |
Defined in Katip.Core Methods (==) :: PayloadSelection -> PayloadSelection -> Bool # (/=) :: PayloadSelection -> PayloadSelection -> Bool # |
itemEnv :: forall a f. Functor f => (Environment -> f Environment) -> Item a -> f (Item a) #
itemPayload :: forall a1 a2 f. Functor f => (a1 -> f a2) -> Item a1 -> f (Item a2) #
itemThread :: forall a f. Functor f => (ThreadIdText -> f ThreadIdText) -> Item a -> f (Item a) #
sl :: ToJSON a => Text -> a -> SimpleLogPayload #
Construct a simple log from any JSON item.
payloadObject :: LogItem a => Verbosity -> a -> Object #
Constrain payload based on verbosity. Backends should use this to automatically bubble higher verbosity levels to lower ones.
itemJson :: LogItem a => Verbosity -> Item a -> Value #
Convert log item to its JSON representation while trimming its payload based on the desired verbosity. Backends that push JSON messages should use this to obtain their payload.
permitAND :: PermitFunc -> PermitFunc -> PermitFunc #
AND together 2 permit functions
permitOR :: PermitFunc -> PermitFunc -> PermitFunc #
OR together 2 permit functions
permitItem :: Monad m => Severity -> Item a -> m Bool #
Should this item be logged given the user's maximum severity?
Most new scribes will use this as a base for their PermitFunc
data ScribeSettings #
Instances
Show ScribeSettings | |
Defined in Katip.Core Methods showsPrec :: Int -> ScribeSettings -> ShowS # show :: ScribeSettings -> String # showList :: [ScribeSettings] -> ShowS # | |
Eq ScribeSettings | |
Defined in Katip.Core Methods (==) :: ScribeSettings -> ScribeSettings -> Bool # (/=) :: ScribeSettings -> ScribeSettings -> Bool # |
logEnvScribes :: Lens' LogEnv (Map Text ScribeHandle) #
Arguments
:: Namespace | A base namespace for this application |
-> Environment | Current run environment (e.g. |
-> IO LogEnv |
Create a reasonable default InitLogEnv. Uses an AutoUpdate
which
updates the timer every 1ms. If you need even more timestamp
precision at the cost of performance, consider setting
_logEnvTimer
with getCurrentTime
.
Add a scribe to the list. All future log calls will go to this scribe in addition to the others. Writes will be buffered per the ScribeSettings to prevent slow scribes from slowing down logging. Writes will be dropped if the buffer fills.
newtype KatipT (m :: Type -> Type) a #
A concrete monad you can use to run logging actions. Use this if
you prefer an explicit monad transformer stack and adding layers as
opposed to implementing Katip
for your monad.
Instances
MonadTransControl KatipT | |
MonadTrans KatipT | |
Defined in Katip.Core | |
HasBackendQueryStats b => LocalQueryStats (b :: k) (KatipT IO) | |
Defined in Napkin.Run.Base Methods tellStats :: QueryStats b -> KatipT IO () # | |
HasBackendQueryStats backend => LocalQueryStats (backend :: k) (ReaderT (IORef (QueryStats backend)) (KatipT IO)) | |
Defined in Napkin.Run.Base Methods tellStats :: QueryStats backend -> ReaderT (IORef (QueryStats backend)) (KatipT IO) () # | |
MonadBaseControl b m => MonadBaseControl b (KatipT m) | |
MonadBase b m => MonadBase b (KatipT m) | |
Defined in Katip.Core | |
MonadIO m => MonadIO (KatipT m) | |
Defined in Katip.Core | |
MonadCatch m => MonadCatch (KatipT m) | |
Defined in Katip.Core | |
MonadMask m => MonadMask (KatipT m) | |
Defined in Katip.Core Methods mask :: HasCallStack => ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b # uninterruptibleMask :: HasCallStack => ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b # generalBracket :: HasCallStack => KatipT m a -> (a -> ExitCase b -> KatipT m c) -> (a -> KatipT m b) -> KatipT m (b, c) # | |
MonadThrow m => MonadThrow (KatipT m) | |
Defined in Katip.Core Methods throwM :: (HasCallStack, Exception e) => e -> KatipT m a # | |
Applicative m => Applicative (KatipT m) | |
Functor m => Functor (KatipT m) | |
Monad m => Monad (KatipT m) | |
MonadFail m => MonadFail (KatipT m) | |
Defined in Katip.Core | |
MonadIO m => Katip (KatipT m) | |
(Monad m, KatipContext m) => KatipContext (KatipT m) | |
Defined in Katip.Monadic Methods getKatipContext :: KatipT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> KatipT m a -> KatipT m a # getKatipNamespace :: KatipT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> KatipT m a -> KatipT m a # | |
MonadResource m => MonadResource (KatipT m) | |
Defined in Katip.Core Methods liftResourceT :: ResourceT IO a -> KatipT m a # | |
MonadUnliftIO m => MonadUnliftIO (KatipT m) | |
Defined in Katip.Core | |
type StT KatipT a | |
Defined in Katip.Core | |
type StM (KatipT m) a | |
Defined in Katip.Core |
defaultScribeSettings :: ScribeSettings #
Reasonable defaults for a scribe. Buffer size of 4096.
Remove a scribe from the environment. This does not finalize
the scribe. This mainly only makes sense to use with something like
MonadReader's local
function to temporarily disavow a single
logger for a block of code.
clearScribes :: LogEnv -> LogEnv #
Unregister all scribes. Note that this is not for closing or
finalizing scribes, use closeScribes
for that. This mainly only
makes sense to use with something like MonadReader's local
function to temporarily disavow any loggers for a block of code.
Finalize a scribe. The scribe is removed from the environment, its finalizer is called so that it can never be written to again and all pending writes are flushed. Note that this will throw any exceptions yoru finalizer will throw, and that LogEnv is immutable, so it will not be removed in that case.
closeScribes :: LogEnv -> IO LogEnv #
Call this at the end of your program. This is a blocking call that stop writing to a scribe's queue, waits for the queue to empty, finalizes each scribe in the log environment and then removes it. Finalizers are all run even if one of them throws, but the exception will be re-thrown at the end.
katipNoLogging :: Katip m => m a -> m a #
Disable all scribes for the given monadic action, then restore them afterwards. Works in any Katip monad.
logItem :: (Applicative m, LogItem a, Katip m) => a -> Namespace -> Maybe Loc -> Severity -> LogStr -> m () #
Log with everything, including a source code location. This is
very low level and you typically can use logT
in its place.
logKatipItem :: (Applicative m, LogItem a, Katip m) => Item a -> m () #
Log already constructed Item
. This is the lowest level function that other log*
functions use.
It can be useful when implementing centralised logging services.
Arguments
:: (Applicative m, LogItem a, Katip m) | |
=> a | Contextual payload for the log |
-> Namespace | Specific namespace of the message. |
-> Severity | Severity of the message |
-> LogStr | The log message |
-> m () |
Log with full context, but without any code location.
Arguments
:: (Katip m, LogItem a, MonadCatch m, Applicative m) | |
=> a | Log context |
-> Namespace | Namespace |
-> Severity | Severity |
-> m b | Main action being run |
-> m b |
Perform an action while logging any exceptions that may occur.
Inspired by onException
.
>>>
> logException () mempty ErrorS (error "foo")
logLoc :: (Applicative m, LogItem a, Katip m, HasCallStack) => a -> Namespace -> Severity -> LogStr -> m () #
Loc
-tagged logging using Stack
when available.
This function does not require template-haskell as it
automatically uses implicit-callstacks
when the code is compiled using GHC > 7.8. Using an older version of the
compiler will result in the emission of a log line without any location information,
so be aware of it. Users using GHC <= 7.8 may want to use the template-haskell function
logT
for maximum compatibility.
logLoc obj mempty InfoS "Hello world"
data KatipContextT (m :: Type -> Type) a #
Provides a simple transformer that defines a KatipContext
instance for a fixed namespace and context. Just like KatipT
, you
should use this if you prefer an explicit transformer stack and
don't want to (or cannot) define KatipContext
for your monad
. This is the slightly more powerful version of KatipT in that it
provides KatipContext instead of just Katip. For instance:
threadWithLogging = do le <- getLogEnv ctx <- getKatipContext ns <- getKatipNamespace forkIO $ runKatipContextT le ctx ns $ do $(logTM) InfoS "Look, I can log in IO and retain context!" doOtherStuff
Instances
MonadTransControl KatipContextT | |||||
Defined in Katip.Monadic Associated Types
Methods liftWith :: Monad m => (Run KatipContextT -> m a) -> KatipContextT m a # restoreT :: Monad m => m (StT KatipContextT a) -> KatipContextT m a # | |||||
MonadTrans KatipContextT | |||||
Defined in Katip.Monadic Methods lift :: Monad m => m a -> KatipContextT m a # | |||||
MonadBaseControl b m => MonadBaseControl b (KatipContextT m) | |||||
Defined in Katip.Monadic Methods liftBaseWith :: (RunInBase (KatipContextT m) b -> b a) -> KatipContextT m a # restoreM :: StM (KatipContextT m) a -> KatipContextT m a # | |||||
MonadError e m => MonadError e (KatipContextT m) | |||||
Defined in Katip.Monadic Methods throwError :: e -> KatipContextT m a # catchError :: KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a # | |||||
MonadReader r m => MonadReader r (KatipContextT m) | |||||
Defined in Katip.Monadic Methods ask :: KatipContextT m r # local :: (r -> r) -> KatipContextT m a -> KatipContextT m a # reader :: (r -> a) -> KatipContextT m a # | |||||
MonadState s m => MonadState s (KatipContextT m) | |||||
Defined in Katip.Monadic Methods get :: KatipContextT m s # put :: s -> KatipContextT m () # state :: (s -> (a, s)) -> KatipContextT m a # | |||||
MonadWriter w m => MonadWriter w (KatipContextT m) | |||||
Defined in Katip.Monadic Methods writer :: (a, w) -> KatipContextT m a # tell :: w -> KatipContextT m () # listen :: KatipContextT m a -> KatipContextT m (a, w) # pass :: KatipContextT m (a, w -> w) -> KatipContextT m a # | |||||
MonadBase b m => MonadBase b (KatipContextT m) | |||||
Defined in Katip.Monadic Methods liftBase :: b α -> KatipContextT m α # | |||||
MonadIO m => MonadIO (KatipContextT m) | |||||
Defined in Katip.Monadic Methods liftIO :: IO a -> KatipContextT m a # | |||||
MonadCatch m => MonadCatch (KatipContextT m) | |||||
Defined in Katip.Monadic Methods catch :: (HasCallStack, Exception e) => KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a # | |||||
MonadMask m => MonadMask (KatipContextT m) | |||||
Defined in Katip.Monadic Methods mask :: HasCallStack => ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b # uninterruptibleMask :: HasCallStack => ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b # generalBracket :: HasCallStack => KatipContextT m a -> (a -> ExitCase b -> KatipContextT m c) -> (a -> KatipContextT m b) -> KatipContextT m (b, c) # | |||||
MonadThrow m => MonadThrow (KatipContextT m) | |||||
Defined in Katip.Monadic Methods throwM :: (HasCallStack, Exception e) => e -> KatipContextT m a # | |||||
Alternative m => Alternative (KatipContextT m) | |||||
Defined in Katip.Monadic Methods empty :: KatipContextT m a # (<|>) :: KatipContextT m a -> KatipContextT m a -> KatipContextT m a # some :: KatipContextT m a -> KatipContextT m [a] # many :: KatipContextT m a -> KatipContextT m [a] # | |||||
Applicative m => Applicative (KatipContextT m) | |||||
Defined in Katip.Monadic Methods pure :: a -> KatipContextT m a # (<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b # liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c # (*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b # (<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a # | |||||
Functor m => Functor (KatipContextT m) | |||||
Defined in Katip.Monadic Methods fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b # (<$) :: a -> KatipContextT m b -> KatipContextT m a # | |||||
Monad m => Monad (KatipContextT m) | |||||
Defined in Katip.Monadic Methods (>>=) :: KatipContextT m a -> (a -> KatipContextT m b) -> KatipContextT m b # (>>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b # return :: a -> KatipContextT m a # | |||||
MonadPlus m => MonadPlus (KatipContextT m) | |||||
Defined in Katip.Monadic Methods mzero :: KatipContextT m a # mplus :: KatipContextT m a -> KatipContextT m a -> KatipContextT m a # | |||||
MonadFail m => MonadFail (KatipContextT m) | |||||
Defined in Katip.Monadic Methods fail :: String -> KatipContextT m a # | |||||
MonadFix m => MonadFix (KatipContextT m) | |||||
Defined in Katip.Monadic Methods mfix :: (a -> KatipContextT m a) -> KatipContextT m a # | |||||
MonadIO m => Katip (KatipContextT m) | |||||
Defined in Katip.Monadic Methods getLogEnv :: KatipContextT m LogEnv # localLogEnv :: (LogEnv -> LogEnv) -> KatipContextT m a -> KatipContextT m a # | |||||
MonadIO m => KatipContext (KatipContextT m) | |||||
Defined in Katip.Monadic Methods getKatipContext :: KatipContextT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> KatipContextT m a -> KatipContextT m a # getKatipNamespace :: KatipContextT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> KatipContextT m a -> KatipContextT m a # | |||||
MonadResource m => MonadResource (KatipContextT m) | |||||
Defined in Katip.Monadic Methods liftResourceT :: ResourceT IO a -> KatipContextT m a # | |||||
MonadUnliftIO m => MonadUnliftIO (KatipContextT m) | |||||
Defined in Katip.Monadic Methods withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b # | |||||
type StT KatipContextT a | |||||
Defined in Katip.Monadic | |||||
type StM (KatipContextT m) a | |||||
Defined in Katip.Monadic |
class Katip m => KatipContext (m :: Type -> Type) where #
A monadic context that has an inherant way to get logging context
and namespace. Examples include a web application monad or database
monad. The local
variants are just like local
from Reader and
indeed you can easily implement them with local
if you happen to
be using a Reader in your monad. These give us katipAddNamespace
and katipAddContext
that works with *any* KatipContext
, as
opposed to making users have to implement these functions on their
own in each app.
Methods
getKatipContext :: m LogContexts #
localKatipContext :: (LogContexts -> LogContexts) -> m a -> m a #
Temporarily modify the current context for the duration of the
supplied monad. Used in katipAddContext
getKatipNamespace :: m Namespace #
localKatipNamespace :: (Namespace -> Namespace) -> m a -> m a #
Temporarily modify the current namespace for the duration of the
supplied monad. Used in katipAddNamespace
Instances
(Monad m, KatipContext m) => KatipContext (KatipT m) | |
Defined in Katip.Monadic Methods getKatipContext :: KatipT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> KatipT m a -> KatipT m a # getKatipNamespace :: KatipT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> KatipT m a -> KatipT m a # | |
MonadIO m => KatipContext (KatipContextT m) | |
Defined in Katip.Monadic Methods getKatipContext :: KatipContextT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> KatipContextT m a -> KatipContextT m a # getKatipNamespace :: KatipContextT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> KatipContextT m a -> KatipContextT m a # | |
MonadIO m => KatipContext (NoLoggingT m) | |
Defined in Katip.Monadic Methods getKatipContext :: NoLoggingT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> NoLoggingT m a -> NoLoggingT m a # getKatipNamespace :: NoLoggingT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> NoLoggingT m a -> NoLoggingT m a # | |
(KatipContext m, Katip (ResourceT m)) => KatipContext (ResourceT m) | |
Defined in Katip.Monadic Methods getKatipContext :: ResourceT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> ResourceT m a -> ResourceT m a # getKatipNamespace :: ResourceT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> ResourceT m a -> ResourceT m a # | |
(KatipContext m, Katip (MaybeT m)) => KatipContext (MaybeT m) | |
Defined in Katip.Monadic Methods getKatipContext :: MaybeT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> MaybeT m a -> MaybeT m a # getKatipNamespace :: MaybeT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> MaybeT m a -> MaybeT m a # | |
(KatipContext m, Katip (ExceptT e m)) => KatipContext (ExceptT e m) | |
Defined in Katip.Monadic Methods getKatipContext :: ExceptT e m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> ExceptT e m a -> ExceptT e m a # getKatipNamespace :: ExceptT e m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> ExceptT e m a -> ExceptT e m a # | |
(KatipContext m, Katip (IdentityT m)) => KatipContext (IdentityT m) | |
Defined in Katip.Monadic Methods getKatipContext :: IdentityT m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> IdentityT m a -> IdentityT m a # getKatipNamespace :: IdentityT m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> IdentityT m a -> IdentityT m a # | |
(KatipContext m, Katip (ReaderT r m)) => KatipContext (ReaderT r m) | |
Defined in Katip.Monadic Methods getKatipContext :: ReaderT r m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> ReaderT r m a -> ReaderT r m a # getKatipNamespace :: ReaderT r m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> ReaderT r m a -> ReaderT r m a # | |
(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) | |
Defined in Katip.Monadic Methods getKatipContext :: StateT s m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> StateT s m a -> StateT s m a # getKatipNamespace :: StateT s m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> StateT s m a -> StateT s m a # | |
(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) | |
Defined in Katip.Monadic Methods getKatipContext :: StateT s m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> StateT s m a -> StateT s m a # getKatipNamespace :: StateT s m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> StateT s m a -> StateT s m a # | |
(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) | |
Defined in Katip.Monadic Methods getKatipContext :: WriterT w m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> WriterT w m a -> WriterT w m a # getKatipNamespace :: WriterT w m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> WriterT w m a -> WriterT w m a # | |
(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) | |
Defined in Katip.Monadic Methods getKatipContext :: WriterT w m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> WriterT w m a -> WriterT w m a # getKatipNamespace :: WriterT w m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> WriterT w m a -> WriterT w m a # | |
(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) | |
Defined in Katip.Monadic Methods getKatipContext :: RWST r w s m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a # getKatipNamespace :: RWST r w s m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a # | |
(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) | |
Defined in Katip.Monadic Methods getKatipContext :: RWST r w s m LogContexts # localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a # getKatipNamespace :: RWST r w s m Namespace # localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a # |
data LogContexts #
Heterogeneous list of log contexts that provides a smart
LogContext
instance for combining multiple payload policies. This
is critical for log contexts deep down in a stack to be able to
inject their own context without worrying about other context that
has already been set. Also note that contexts are treated as a
sequence and <>
will be appended to the right hand side of the
sequence. If there are conflicting keys in the contexts, the /right
side will take precedence/, which is counter to how monoid works
for Map
and HashMap
, so bear that in mind. The reasoning is
that if the user is sequentially adding contexts to the right
side of the sequence, on conflict the intent is to overwrite with
the newer value (i.e. the rightmost value).
Additional note: you should not mappend LogContexts in any sort of infinite loop, as it retains all data, so that would be a memory leak.
Instances
ToJSON LogContexts | |
Defined in Katip.Monadic Methods toJSON :: LogContexts -> Value # toEncoding :: LogContexts -> Encoding # toJSONList :: [LogContexts] -> Value # toEncodingList :: [LogContexts] -> Encoding # omitField :: LogContexts -> Bool # | |
Monoid LogContexts | |
Defined in Katip.Monadic Methods mempty :: LogContexts # mappend :: LogContexts -> LogContexts -> LogContexts # mconcat :: [LogContexts] -> LogContexts # | |
Semigroup LogContexts | |
Defined in Katip.Monadic Methods (<>) :: LogContexts -> LogContexts -> LogContexts # sconcat :: NonEmpty LogContexts -> LogContexts # stimes :: Integral b => b -> LogContexts -> LogContexts # | |
LogItem LogContexts | |
Defined in Katip.Monadic Methods payloadKeys :: Verbosity -> LogContexts -> PayloadSelection # | |
ToObject LogContexts | |
Defined in Katip.Monadic Methods toObject :: LogContexts -> Object # |
data AnyLogContext #
A wrapper around a log context that erases type information so that contexts from multiple layers can be combined intelligently.
liftPayload :: LogItem a => a -> LogContexts #
Lift a log context into the generic wrapper so that it can combine with the existing log context.
logItemM :: (Applicative m, KatipContext m, HasCallStack) => Maybe Loc -> Severity -> LogStr -> m () #
Log with everything, including a source code location. This is
very low level and you typically can use logTM
in its
place. Automatically supplies payload and namespace.
Arguments
:: (Applicative m, KatipContext m) | |
=> Severity | Severity of the message |
-> LogStr | The log message |
-> m () |
Log with full context, but without any code location. Automatically supplies payload and namespace.
Loc
-tagged logging when using template-haskell. Automatically
supplies payload and namespace.
$(logTM) InfoS "Hello world"
logLocM :: (Applicative m, KatipContext m, HasCallStack) => Severity -> LogStr -> m () #
Loc
-tagged logging when using getCallStack
implicit-callstacks>.
Automatically supplies payload and namespace.
Same consideration as logLoc
applies.
By default, location will be logged from the module that invokes logLocM
.
If you want to use logLocM
in a helper, wrap the entire helper in
withFrozenCallStack
to retain the callsite of the helper in the logs.
This function does not require template-haskell. Using GHC <= 7.8 will result
in the emission of a log line without any location information.
Users using GHC <= 7.8 may want to use the template-haskell function
logTM
for maximum compatibility.
logLocM InfoS "Hello world"
Arguments
:: (KatipContext m, MonadCatch m, Applicative m) | |
=> m a | Main action to run |
-> Severity | Severity |
-> m a |
Perform an action while logging any exceptions that may occur.
Inspired by onException
.
>>>
> error "foo" `logExceptionM` ErrorS
runKatipContextT :: LogItem c => LogEnv -> c -> Namespace -> KatipContextT m a -> m a #
katipAddNamespace :: KatipContext m => Namespace -> m a -> m a #
Append a namespace segment to the current namespace for the given monadic action, then restore the previous state afterwards. Works with anything implementing KatipContext.
katipAddContext :: (LogItem i, KatipContext m) => i -> m a -> m a #
Append some context to the current context for the given monadic
action, then restore the previous state afterwards. Important note:
be careful using this in a loop. If you're using something like
forever
or replicateM_
that does explicit sharing to avoid a
memory leak, youll be fine as it will *sequence* calls to
katipAddNamespace
, so each loop will get the same context
added. If you instead roll your own recursion and you're recursing
in the action you provide, you'll instead accumulate tons of
redundant contexts and even if they all merge on log, they are
stored in a sequence and will leak memory. Works with anything
implementing KatipContext.
type ItemFormatter a = Bool -> Verbosity -> Item a -> Builder #
A custom ItemFormatter for logging Item
s. Takes a Bool
indicating
whether to colorize the output, Verbosity
of output, and an Item
to
format.
See bracketFormat
and jsonFormat
for examples.
data ColorStrategy #
Constructors
ColorLog Bool | Whether to use color control chars in log output |
ColorIfTerminal | Color if output is a terminal |
Instances
Show ColorStrategy | |
Defined in Katip.Scribes.Handle Methods showsPrec :: Int -> ColorStrategy -> ShowS # show :: ColorStrategy -> String # showList :: [ColorStrategy] -> ShowS # | |
Eq ColorStrategy | |
Defined in Katip.Scribes.Handle Methods (==) :: ColorStrategy -> ColorStrategy -> Bool # (/=) :: ColorStrategy -> ColorStrategy -> Bool # |
mkHandleScribe :: ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #
Logs to a file handle such as stdout, stderr, or a file. Contexts and other information will be flattened out into bracketed fields. For example:
[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:32:7] Started [2016-05-11 21:01:15][MyApp.confrabulation][Debug][myhost.example.com][PID 1724][ThreadId 1154][confrab_factor:42.0][main:Helpers.Logging Helpers/Logging.hs:41:9] Confrabulating widgets, with extra namespace and context [2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:43:7] Namespace and context are back to normal
Returns the newly-created Scribe
. The finalizer flushes the
handle. Handle mode is set to LineBuffering
automatically.
mkHandleScribeWithFormatter :: (forall a. LogItem a => ItemFormatter a) -> ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #
Logs to a file handle such as stdout, stderr, or a file. Takes a custom
ItemFormatter
that can be used to format Item
as needed.
Returns the newly-created Scribe
. The finalizer flushes the
handle. Handle mode is set to LineBuffering
automatically.
mkFileScribe :: FilePath -> PermitFunc -> Verbosity -> IO Scribe #
A specialization of mkHandleScribe
that takes a FilePath
instead of a Handle
. It is responsible for opening the file in
AppendMode
and will close the file handle on
closeScribe
/closeScribes
. Does not do log coloring. Sets handle
to LineBuffering
mode.
bracketFormat :: LogItem a => ItemFormatter a #
A traditional bracketed
log format. Contexts and other information will
be flattened out into bracketed fields. For example:
[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:32:7] Started [2016-05-11 21:01:15][MyApp.confrabulation][Debug][myhost.example.com][PID 1724][ThreadId 1154][confrab_factor:42.0][main:Helpers.Logging Helpers/Logging.hs:41:9] Confrabulating widgets, with extra namespace and context [2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:43:7] Namespace and context are back to normal
jsonFormat :: LogItem a => ItemFormatter a #
Logs items as JSON. This can be useful in circumstances where you already have infrastructure that is expecting JSON to be logged to a standard stream or file. For example:
{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Started","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":44},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"} {"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp","confrabulation"],"data":{"confrab_factor":42},"app":["MyApp"],"msg":"Confrabulating widgets, with extra namespace and context","pid":"10456","loc":{"loc_col":11,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":53},"host":"myhost.example.com","sev":"Debug","thread":"ThreadId 139"} {"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Namespace and context are back to normal","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":55},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"}
Constructors
AsStruct | |
AsStructNo | |
AsValue |
Instances
NFData AsStruct | |||||
Defined in Napkin.Types.Core | |||||
Data AsStruct | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AsStruct -> c AsStruct # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AsStruct # toConstr :: AsStruct -> Constr # dataTypeOf :: AsStruct -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AsStruct) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AsStruct) # gmapT :: (forall b. Data b => b -> b) -> AsStruct -> AsStruct # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AsStruct -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AsStruct -> r # gmapQ :: (forall d. Data d => d -> u) -> AsStruct -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> AsStruct -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct # | |||||
Generic AsStruct | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Read AsStruct | |||||
Show AsStruct | |||||
Eq AsStruct | |||||
Ord AsStruct | |||||
Defined in Napkin.Types.Core | |||||
Lift AsStruct | |||||
type Rep AsStruct | |||||
Defined in Napkin.Types.Core type Rep AsStruct = D1 ('MetaData "AsStruct" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "AsStruct" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AsStructNo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AsValue" 'PrefixI 'False) (U1 :: Type -> Type))) |
bqSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in BigQuery
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in BigQuery
backend with TemplateHaskell
QuasiQuoter
for declaring one or many clauses of a select statement in BigQuery
backend with TemplateHaskell
QuasiQuoter
for declaring a From
("from" keyword and a corresponding Relation
) in BigQuery
backend with TemplateHaskell
bqSQLRel :: QuasiQuoter #
QuasiQuoter
for declaring a Alias
Relation
(corresponds "table as alias" syntax) in BigQuery
backend with TemplateHaskell
debugSql' :: forall {k} (b :: k) a. RenderSql a b => a -> Unshow #
for evaluating queries in source code comments, use instances defined in Napkin.Backend...
renderSql' :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text #
renderSqlCollapsed :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text #
styleCollapsed :: Style #
class RenderSql a (backend :: k) where #
If one day we support multiple backends, one option would be for this typeclass to take a (Proxy backend) argument to dispatch on the right backend.
data RenderedSql #
Constructors
RenderSql a backend => RenderedSql (Proxy backend) a |
Workaround for HLS eval plugin (using show) not handling multiline output well
data family BackendSpecificEffect b :: Effect #
Instances
data BackendSpecificEffect BigQuery m a | |
Defined in Napkin.Run.Effects.Languages.Backend.BigQuery data BackendSpecificEffect BigQuery m a where
| |
data BackendSpecificEffect MsSql m a | |
Defined in Napkin.Run.Effects.Languages.Backend.MsSql | |
data BackendSpecificEffect Postgres m a | |
data BackendSpecificEffect Redshift m a | |
data BackendSpecificEffect Sqlite m a | |
Defined in Napkin.Run.Effects.Languages.Backend.Sqlite |
scopeGeneric :: [(Ref Function, SExp)] -> SExp -> SExp -> SExp #
Apply a given predicate condition deeply within a given expression, such that the predicate is pushed inside all the aggregating function calls in SQL.
This makes it possible to have conditional aggregations without needing additional CTEs.
TODO. This is may have holes; we need a principled end-to-end review of this transformation. Perhaps even put it as a primitive into the SExp type.
data NullStrategy #
Constructors
IgnoreNulls | |
RespectNulls |
Instances
NFData NullStrategy | |||||
Defined in Napkin.Types.Core Methods rnf :: NullStrategy -> () # | |||||
Data NullStrategy | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NullStrategy -> c NullStrategy # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NullStrategy # toConstr :: NullStrategy -> Constr # dataTypeOf :: NullStrategy -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NullStrategy) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NullStrategy) # gmapT :: (forall b. Data b => b -> b) -> NullStrategy -> NullStrategy # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NullStrategy -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NullStrategy -> r # gmapQ :: (forall d. Data d => d -> u) -> NullStrategy -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NullStrategy -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy # | |||||
Generic NullStrategy | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show NullStrategy | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NullStrategy -> ShowS # show :: NullStrategy -> String # showList :: [NullStrategy] -> ShowS # | |||||
Eq NullStrategy | |||||
Defined in Napkin.Types.Core | |||||
Ord NullStrategy | |||||
Defined in Napkin.Types.Core Methods compare :: NullStrategy -> NullStrategy -> Ordering # (<) :: NullStrategy -> NullStrategy -> Bool # (<=) :: NullStrategy -> NullStrategy -> Bool # (>) :: NullStrategy -> NullStrategy -> Bool # (>=) :: NullStrategy -> NullStrategy -> Bool # max :: NullStrategy -> NullStrategy -> NullStrategy # min :: NullStrategy -> NullStrategy -> NullStrategy # | |||||
Lift NullStrategy | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => NullStrategy -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => NullStrategy -> Code m NullStrategy # | |||||
type Rep NullStrategy | |||||
msSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in MsSql
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in MsSql
backend with TemplateHaskell
QuasiQuoter
for declaring one or many clauses of a select statement in MsSql
backend with TemplateHaskell
QuasiQuoter
for declaring a From
("from" keyword and a corresponding Relation
) in MsSql
backend with TemplateHaskell
msSQLRel :: QuasiQuoter #
QuasiQuoter
for declaring a Alias
Relation
(corresponds "table as alias" syntax) in MsSql
backend with TemplateHaskell
pgSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in Postgres
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in Postgres
backend with TemplateHaskell
QuasiQuoter
for declaring one or many clauses of a select statement in Postgres
backend with TemplateHaskell
QuasiQuoter
for declaring a From
("from" keyword and a corresponding Relation
) in Postgres
backend with TemplateHaskell
pgSQLRel :: QuasiQuoter #
QuasiQuoter
for declaring a Alias
Relation
(corresponds "table as alias" syntax) in Postgres
backend with TemplateHaskell
rsSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in Postgres
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in Redshift
backend with TemplateHaskell
QuasiQuoter
for declaring one or many clauses of a select statement in Redshift
backend with TemplateHaskell
QuasiQuoter
for declaring a From
("from" keyword and a corresponding Relation
) in Redshift
backend with TemplateHaskell
rsSQLRel :: QuasiQuoter #
QuasiQuoter
for declaring a Alias
Relation
(corresponds "table as alias" syntax) in Redshift
backend with TemplateHaskell
npgSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in Postgres
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in Postgres
backend with TemplateHaskell
Class of string-like types that can be interpreted as Ref
s
Instances
IsRef Name | |
Defined in Napkin.Types.Core | |
IsRef LText | |
Defined in Napkin.Types.Core | |
IsRef Text | |
Defined in Napkin.Types.Core | |
IsRef String | |
Defined in Napkin.Types.Core | |
IsRef (NonEmpty Name) | |
IsRef [Name] | |
Defined in Napkin.Types.Core | |
IsRef (Ref a) | |
Defined in Napkin.Types.Core |
checkTableExists :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r Bool #
Constructors
TableRelation (Ref Table) | |
QueryRelation Query | |
ArrayRelation SExp (Maybe Name) | |
RawRelation [Ref Table] Text | Escape hatch: A raw relation with its dependencies. Avoid if possible |
Instances
NFData Relation | |||||
Defined in Napkin.Types.Core | |||||
Data Relation | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Relation -> c Relation # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Relation # toConstr :: Relation -> Constr # dataTypeOf :: Relation -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Relation) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Relation) # gmapT :: (forall b. Data b => b -> b) -> Relation -> Relation # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Relation -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Relation -> r # gmapQ :: (forall d. Data d => d -> u) -> Relation -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Relation -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Relation -> m Relation # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Relation -> m Relation # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Relation -> m Relation # | |||||
IsString Relation | |||||
Defined in Napkin.Types.Core Methods fromString :: String -> Relation # | |||||
Generic Relation | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Relation | |||||
Eq Relation | |||||
Ord Relation | |||||
Defined in Napkin.Types.Core | |||||
AsRelation Relation | |||||
Defined in Napkin.Types.Core Methods asRelation :: Relation -> Relation # | |||||
MaybeQuery Relation | |||||
HasDeps Relation | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer Relation | |||||
TableRenamer Relation | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift Relation | |||||
FunRenamer (Selected Relation) | |||||
TableRenamer (Selected Relation) | |||||
type Rep Relation | |||||
Defined in Napkin.Types.Core type Rep Relation = D1 ('MetaData "Relation" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "TableRelation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Table))) :+: C1 ('MetaCons "QueryRelation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query))) :+: (C1 ('MetaCons "ArrayRelation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Name))) :+: C1 ('MetaCons "RawRelation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Table]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))) |
slSQL :: QuasiQuoter #
QuasiQuoter
for declaring a Query
in Sqlite
backend with TemplateHaskell
QuasiQuoter
for declaring a SExp
in Sqlite
backend with TemplateHaskell
QuasiQuoter
for declaring one or many clauses of a select statement in Sqlite
backend with TemplateHaskell
QuasiQuoter
for declaring a From
("from" keyword and a corresponding Relation
) in Sqlite
backend with TemplateHaskell
slSQLRel :: QuasiQuoter #
QuasiQuoter
for declaring a Alias
Relation
(corresponds "table as alias" syntax) in Sqlite
backend with TemplateHaskell
renameTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> Sem r () #
newtype RandomToken #
Constructors
RandomToken | |
Fields |
class MaybeQuery s where #
Things that may or may not contain an explicit Query inside
Instances
MaybeQuery Query | |
MaybeQuery Relation | |
MaybeQuery (CreateTableAs m) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods getQuery :: CreateTableAs m -> Maybe Query # | |
MaybeQuery (Q ()) | |
class HasDefinition s where #
Instances
HasDefinition Query | |
HasDefinition (CreateTableAs m) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods defQuery :: Lens (CreateTableAs m) (CreateTableAs m) Query Query # | |
HasDefinition (Q ()) | |
class AsRelation s where #
Methods
asRelation :: s -> Relation #
Instances
AsRelation DefinedRelation | |
Defined in Napkin.Types.Core Methods asRelation :: DefinedRelation -> Relation # | |
AsRelation Query | |
Defined in Napkin.Types.Core Methods asRelation :: Query -> Relation # | |
AsRelation Relation | |
Defined in Napkin.Types.Core Methods asRelation :: Relation -> Relation # | |
AsRelation SpecTableName | |
Defined in Napkin.Types.Core Methods asRelation :: SpecTableName -> Relation # | |
AsRelation (CreateTableAs m) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods asRelation :: CreateTableAs m -> Relation # | |
AsRelation (Q a) | |
Defined in Napkin.Untyped.Monad Methods asRelation :: Q a -> Relation # | |
AsRelation (Ref a) | |
Defined in Napkin.Types.Core Methods asRelation :: Ref a -> Relation # |
data DefinedQuery #
Like DefinedRelation
, but only requires a defined query.
Constructors
HasDefinition s => DefinedQuery s |
data DefinedRelation #
OO-style wrapper for objects that contain a full query definition
Constructors
(AsRelation s, HasDefinition s, MaybeQuery s) => DefinedRelation s |
Instances
AsRelation DefinedRelation | |
Defined in Napkin.Types.Core Methods asRelation :: DefinedRelation -> Relation # |
data NativeQuery #
Instances
NFData NativeQuery | |||||
Defined in Napkin.Types.Core Methods rnf :: NativeQuery -> () # | |||||
Data NativeQuery | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NativeQuery -> c NativeQuery # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NativeQuery # toConstr :: NativeQuery -> Constr # dataTypeOf :: NativeQuery -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NativeQuery) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NativeQuery) # gmapT :: (forall b. Data b => b -> b) -> NativeQuery -> NativeQuery # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NativeQuery -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NativeQuery -> r # gmapQ :: (forall d. Data d => d -> u) -> NativeQuery -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NativeQuery -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery # | |||||
Generic NativeQuery | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show NativeQuery | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NativeQuery -> ShowS # show :: NativeQuery -> String # showList :: [NativeQuery] -> ShowS # | |||||
Eq NativeQuery | |||||
Defined in Napkin.Types.Core | |||||
Ord NativeQuery | |||||
Defined in Napkin.Types.Core Methods compare :: NativeQuery -> NativeQuery -> Ordering # (<) :: NativeQuery -> NativeQuery -> Bool # (<=) :: NativeQuery -> NativeQuery -> Bool # (>) :: NativeQuery -> NativeQuery -> Bool # (>=) :: NativeQuery -> NativeQuery -> Bool # max :: NativeQuery -> NativeQuery -> NativeQuery # min :: NativeQuery -> NativeQuery -> NativeQuery # | |||||
Lift NativeQuery | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => NativeQuery -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => NativeQuery -> Code m NativeQuery # | |||||
type Rep NativeQuery | |||||
Defined in Napkin.Types.Core type Rep NativeQuery = D1 ('MetaData "NativeQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresSelectStmt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SelectStmt)) :+: C1 ('MetaCons "SimpleSQLParserQueryExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryExpr))) |
type ColumnComment = (Ref SExp, Text) #
data ParensOperator #
Constructors
ParensOperator [Ref Function] [ParensOperatorArgument] |
Instances
NFData ParensOperator | |||||
Defined in Napkin.Types.Core Methods rnf :: ParensOperator -> () # | |||||
Data ParensOperator | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParensOperator -> c ParensOperator # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParensOperator # toConstr :: ParensOperator -> Constr # dataTypeOf :: ParensOperator -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParensOperator) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParensOperator) # gmapT :: (forall b. Data b => b -> b) -> ParensOperator -> ParensOperator # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperator -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperator -> r # gmapQ :: (forall d. Data d => d -> u) -> ParensOperator -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ParensOperator -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator # | |||||
Generic ParensOperator | |||||
Defined in Napkin.Types.Core Associated Types
Methods from :: ParensOperator -> Rep ParensOperator x # to :: Rep ParensOperator x -> ParensOperator # | |||||
Show ParensOperator | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> ParensOperator -> ShowS # show :: ParensOperator -> String # showList :: [ParensOperator] -> ShowS # | |||||
Eq ParensOperator | |||||
Defined in Napkin.Types.Core Methods (==) :: ParensOperator -> ParensOperator -> Bool # (/=) :: ParensOperator -> ParensOperator -> Bool # | |||||
Ord ParensOperator | |||||
Defined in Napkin.Types.Core Methods compare :: ParensOperator -> ParensOperator -> Ordering # (<) :: ParensOperator -> ParensOperator -> Bool # (<=) :: ParensOperator -> ParensOperator -> Bool # (>) :: ParensOperator -> ParensOperator -> Bool # (>=) :: ParensOperator -> ParensOperator -> Bool # max :: ParensOperator -> ParensOperator -> ParensOperator # min :: ParensOperator -> ParensOperator -> ParensOperator # | |||||
Lift ParensOperator | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => ParensOperator -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => ParensOperator -> Code m ParensOperator # | |||||
type Rep ParensOperator | |||||
Defined in Napkin.Types.Core type Rep ParensOperator = D1 ('MetaData "ParensOperator" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperatorArgument]))) |
data ParensOperatorArgument #
Constructors
ParensOperatorArgument [Keyword] (Alias SExp) | |
ParensOperatorConst [Keyword] |
Instances
NFData ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods rnf :: ParensOperatorArgument -> () # | |||||
Data ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParensOperatorArgument -> c ParensOperatorArgument # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParensOperatorArgument # toConstr :: ParensOperatorArgument -> Constr # dataTypeOf :: ParensOperatorArgument -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParensOperatorArgument) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParensOperatorArgument) # gmapT :: (forall b. Data b => b -> b) -> ParensOperatorArgument -> ParensOperatorArgument # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperatorArgument -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperatorArgument -> r # gmapQ :: (forall d. Data d => d -> u) -> ParensOperatorArgument -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ParensOperatorArgument -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument # | |||||
Generic ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Associated Types
Methods from :: ParensOperatorArgument -> Rep ParensOperatorArgument x # to :: Rep ParensOperatorArgument x -> ParensOperatorArgument # | |||||
Show ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> ParensOperatorArgument -> ShowS # show :: ParensOperatorArgument -> String # showList :: [ParensOperatorArgument] -> ShowS # | |||||
Eq ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods (==) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (/=) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # | |||||
Ord ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods compare :: ParensOperatorArgument -> ParensOperatorArgument -> Ordering # (<) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (<=) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (>) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # (>=) :: ParensOperatorArgument -> ParensOperatorArgument -> Bool # max :: ParensOperatorArgument -> ParensOperatorArgument -> ParensOperatorArgument # min :: ParensOperatorArgument -> ParensOperatorArgument -> ParensOperatorArgument # | |||||
Lift ParensOperatorArgument | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => ParensOperatorArgument -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => ParensOperatorArgument -> Code m ParensOperatorArgument # | |||||
type Rep ParensOperatorArgument | |||||
Defined in Napkin.Types.Core type Rep ParensOperatorArgument = D1 ('MetaData "ParensOperatorArgument" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperatorArgument" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias SExp))) :+: C1 ('MetaCons "ParensOperatorConst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword]))) |
data WithClauses #
CTE expression support- the RECURSIVE keyword allows any subsequently mentioned CTEs to be recursive (but are not necessarily recursive).
Constructors
WithClauses | |
Fields |
Instances
Default WithClauses | |||||
Defined in Napkin.Types.Core Methods def :: WithClauses # | |||||
NFData WithClauses | |||||
Defined in Napkin.Types.Core Methods rnf :: WithClauses -> () # | |||||
Data WithClauses | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WithClauses -> c WithClauses # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WithClauses # toConstr :: WithClauses -> Constr # dataTypeOf :: WithClauses -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WithClauses) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WithClauses) # gmapT :: (forall b. Data b => b -> b) -> WithClauses -> WithClauses # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WithClauses -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WithClauses -> r # gmapQ :: (forall d. Data d => d -> u) -> WithClauses -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WithClauses -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses # | |||||
Generic WithClauses | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show WithClauses | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WithClauses -> ShowS # show :: WithClauses -> String # showList :: [WithClauses] -> ShowS # | |||||
Eq WithClauses | |||||
Defined in Napkin.Types.Core | |||||
Ord WithClauses | |||||
Defined in Napkin.Types.Core Methods compare :: WithClauses -> WithClauses -> Ordering # (<) :: WithClauses -> WithClauses -> Bool # (<=) :: WithClauses -> WithClauses -> Bool # (>) :: WithClauses -> WithClauses -> Bool # (>=) :: WithClauses -> WithClauses -> Bool # max :: WithClauses -> WithClauses -> WithClauses # min :: WithClauses -> WithClauses -> WithClauses # | |||||
HasDeps WithClauses | |||||
Defined in Napkin.Types.Deps Methods dependenciesSet :: WithClauses -> Set (Ref Table) # | |||||
FunRenamer WithClauses | |||||
Defined in Napkin.Types.QueryTransformer Methods renameFun :: (Ref Function -> Ref Function) -> WithClauses -> WithClauses # | |||||
TableRenamer WithClauses | |||||
Defined in Napkin.Types.QueryTransformer Methods renameTableRef :: (Ref Table -> Ref Table) -> WithClauses -> WithClauses # | |||||
Lift WithClauses | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => WithClauses -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => WithClauses -> Code m WithClauses # | |||||
type Rep WithClauses | |||||
Defined in Napkin.Types.Core type Rep WithClauses = D1 ('MetaData "WithClauses" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithClauses" 'PrefixI 'True) (S1 ('MetaSel ('Just "_withClauses_recursive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "_withClauses_cteBodies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap (Ref Query) CteBody)))) |
Constructors
JustCteBody (Selected Query) | |
PositionalBoundsCteBody (NonEmpty (Ref SExp)) (Selected Query) |
Instances
NFData CteBody | |||||
Defined in Napkin.Types.Core | |||||
Data CteBody | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CteBody -> c CteBody # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CteBody # toConstr :: CteBody -> Constr # dataTypeOf :: CteBody -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CteBody) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CteBody) # gmapT :: (forall b. Data b => b -> b) -> CteBody -> CteBody # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CteBody -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CteBody -> r # gmapQ :: (forall d. Data d => d -> u) -> CteBody -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CteBody -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody # | |||||
Generic CteBody | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show CteBody | |||||
Eq CteBody | |||||
Ord CteBody | |||||
HasDeps CteBody | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer CteBody | |||||
TableRenamer CteBody | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift CteBody | |||||
type Rep CteBody | |||||
Defined in Napkin.Types.Core type Rep CteBody = D1 ('MetaData "CteBody" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "JustCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query))) :+: C1 ('MetaCons "PositionalBoundsCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Ref SExp))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query)))) |
Constructors
RawQuery | |
Fields
|
Instances
NFData RawQuery | |||||
Defined in Napkin.Types.Core | |||||
Data RawQuery | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RawQuery -> c RawQuery # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RawQuery # toConstr :: RawQuery -> Constr # dataTypeOf :: RawQuery -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RawQuery) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RawQuery) # gmapT :: (forall b. Data b => b -> b) -> RawQuery -> RawQuery # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RawQuery -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RawQuery -> r # gmapQ :: (forall d. Data d => d -> u) -> RawQuery -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RawQuery -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery # | |||||
Generic RawQuery | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show RawQuery | |||||
Eq RawQuery | |||||
Ord RawQuery | |||||
Defined in Napkin.Types.Core | |||||
Lift RawQuery | |||||
type Rep RawQuery | |||||
Defined in Napkin.Types.Core type Rep RawQuery = D1 ('MetaData "RawQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "RawQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "_rawQuery_deps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Table]) :*: S1 ('MetaSel ('Just "_rawQuery_raw") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
Constructors
SetUnion | |
DuplicateUnion | |
IntersectUnion | |
MinusUnion |
Instances
NFData UnionType | |||||
Defined in Napkin.Types.Core | |||||
Data UnionType | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnionType -> c UnionType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnionType # toConstr :: UnionType -> Constr # dataTypeOf :: UnionType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnionType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnionType) # gmapT :: (forall b. Data b => b -> b) -> UnionType -> UnionType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnionType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnionType -> r # gmapQ :: (forall d. Data d => d -> u) -> UnionType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UnionType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType # | |||||
Generic UnionType | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show UnionType | |||||
Eq UnionType | |||||
Ord UnionType | |||||
Lift UnionType | |||||
type Rep UnionType | |||||
Defined in Napkin.Types.Core type Rep UnionType = D1 ('MetaData "UnionType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SetUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DuplicateUnion" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IntersectUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MinusUnion" 'PrefixI 'False) (U1 :: Type -> Type))) |
Instances
NFData JoinType | |||||
Defined in Napkin.Types.Core | |||||
Data JoinType | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JoinType -> c JoinType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c JoinType # toConstr :: JoinType -> Constr # dataTypeOf :: JoinType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c JoinType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c JoinType) # gmapT :: (forall b. Data b => b -> b) -> JoinType -> JoinType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JoinType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JoinType -> r # gmapQ :: (forall d. Data d => d -> u) -> JoinType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> JoinType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType # | |||||
Generic JoinType | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show JoinType | |||||
Eq JoinType | |||||
Ord JoinType | |||||
Defined in Napkin.Types.Core | |||||
Lift JoinType | |||||
type Rep JoinType | |||||
Defined in Napkin.Types.Core type Rep JoinType = D1 ('MetaData "JoinType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "JoinLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "JoinInner" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "JoinCross" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinOuter" 'PrefixI 'False) (U1 :: Type -> Type)))) |
Instances
NFData OrderPart | |||||
Defined in Napkin.Types.Core | |||||
Data OrderPart | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderPart -> c OrderPart # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderPart # toConstr :: OrderPart -> Constr # dataTypeOf :: OrderPart -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderPart) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderPart) # gmapT :: (forall b. Data b => b -> b) -> OrderPart -> OrderPart # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderPart -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderPart -> r # gmapQ :: (forall d. Data d => d -> u) -> OrderPart -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderPart -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart # | |||||
Generic OrderPart | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show OrderPart | |||||
Eq OrderPart | |||||
Ord OrderPart | |||||
FunRenamer OrderPart | |||||
TableRenamer OrderPart | |||||
Defined in Napkin.Types.QueryTransformer | |||||
Lift OrderPart | |||||
type Rep OrderPart | |||||
Defined in Napkin.Types.Core type Rep OrderPart = D1 ('MetaData "OrderPart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "OrderPart" 'PrefixI 'True) (S1 ('MetaSel ('Just "_opExp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: (S1 ('MetaSel ('Just "_opOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OrderDir) :*: S1 ('MetaSel ('Just "_opNulls") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NullOrder))))) |
Constructors
NullsFirst | |
NullsLast |
Instances
NFData NullOrder | |
Defined in Napkin.Types.Core | |
Data NullOrder | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NullOrder -> c NullOrder # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NullOrder # toConstr :: NullOrder -> Constr # dataTypeOf :: NullOrder -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NullOrder) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NullOrder) # gmapT :: (forall b. Data b => b -> b) -> NullOrder -> NullOrder # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NullOrder -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NullOrder -> r # gmapQ :: (forall d. Data d => d -> u) -> NullOrder -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NullOrder -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder # | |
Generic NullOrder | |
Defined in Napkin.Types.Core | |
Show NullOrder | |
Eq NullOrder | |
Ord NullOrder | |
Lift NullOrder | |
type Rep NullOrder | |
Instances
NFData OrderDir | |
Defined in Napkin.Types.Core | |
Data OrderDir | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderDir -> c OrderDir # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderDir # toConstr :: OrderDir -> Constr # dataTypeOf :: OrderDir -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderDir) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderDir) # gmapT :: (forall b. Data b => b -> b) -> OrderDir -> OrderDir # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderDir -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderDir -> r # gmapQ :: (forall d. Data d => d -> u) -> OrderDir -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderDir -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir # | |
Generic OrderDir | |
Defined in Napkin.Types.Core | |
Show OrderDir | |
Eq OrderDir | |
Ord OrderDir | |
Defined in Napkin.Types.Core | |
CombiBomb OrderDir | |
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods toParensOperatorArgs :: OrderDir -> [ParensOperatorArgument] # | |
Lift OrderDir | |
type Rep OrderDir | |
type OriginTypeName = Text #
data FunModifier #
Constructors
ModDistinct Distinctness | |
ModNulls NullStrategy | |
ModOrder Order | |
ModLimit Int | |
ModOver WOver |
Instances
NFData FunModifier | |||||
Defined in Napkin.Types.Core Methods rnf :: FunModifier -> () # | |||||
Data FunModifier | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunModifier -> c FunModifier # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunModifier # toConstr :: FunModifier -> Constr # dataTypeOf :: FunModifier -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunModifier) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunModifier) # gmapT :: (forall b. Data b => b -> b) -> FunModifier -> FunModifier # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunModifier -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunModifier -> r # gmapQ :: (forall d. Data d => d -> u) -> FunModifier -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FunModifier -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier # | |||||
Generic FunModifier | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show FunModifier | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> FunModifier -> ShowS # show :: FunModifier -> String # showList :: [FunModifier] -> ShowS # | |||||
Eq FunModifier | |||||
Defined in Napkin.Types.Core | |||||
Ord FunModifier | |||||
Defined in Napkin.Types.Core Methods compare :: FunModifier -> FunModifier -> Ordering # (<) :: FunModifier -> FunModifier -> Bool # (<=) :: FunModifier -> FunModifier -> Bool # (>) :: FunModifier -> FunModifier -> Bool # (>=) :: FunModifier -> FunModifier -> Bool # max :: FunModifier -> FunModifier -> FunModifier # min :: FunModifier -> FunModifier -> FunModifier # | |||||
Lift FunModifier | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => FunModifier -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => FunModifier -> Code m FunModifier # | |||||
type Rep FunModifier | |||||
Defined in Napkin.Types.Core type Rep FunModifier = D1 ('MetaData "FunModifier" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "ModDistinct" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Distinctness)) :+: C1 ('MetaCons "ModNulls" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NullStrategy))) :+: (C1 ('MetaCons "ModOrder" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order)) :+: (C1 ('MetaCons "ModLimit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "ModOver" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WOver))))) |
data FrameLength #
Constructors
CurrentRow | |
Unbounded | |
LimitedPreceding SExp | |
LimitedFollowing SExp |
Instances
NFData FrameLength | |||||
Defined in Napkin.Types.Core Methods rnf :: FrameLength -> () # | |||||
Data FrameLength | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FrameLength -> c FrameLength # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FrameLength # toConstr :: FrameLength -> Constr # dataTypeOf :: FrameLength -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FrameLength) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FrameLength) # gmapT :: (forall b. Data b => b -> b) -> FrameLength -> FrameLength # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FrameLength -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FrameLength -> r # gmapQ :: (forall d. Data d => d -> u) -> FrameLength -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FrameLength -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength # | |||||
Generic FrameLength | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show FrameLength | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> FrameLength -> ShowS # show :: FrameLength -> String # showList :: [FrameLength] -> ShowS # | |||||
Eq FrameLength | |||||
Defined in Napkin.Types.Core | |||||
Ord FrameLength | |||||
Defined in Napkin.Types.Core Methods compare :: FrameLength -> FrameLength -> Ordering # (<) :: FrameLength -> FrameLength -> Bool # (<=) :: FrameLength -> FrameLength -> Bool # (>) :: FrameLength -> FrameLength -> Bool # (>=) :: FrameLength -> FrameLength -> Bool # max :: FrameLength -> FrameLength -> FrameLength # min :: FrameLength -> FrameLength -> FrameLength # | |||||
Lift FrameLength | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => FrameLength -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => FrameLength -> Code m FrameLength # | |||||
type Rep FrameLength | |||||
Defined in Napkin.Types.Core type Rep FrameLength = D1 ('MetaData "FrameLength" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "CurrentRow" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unbounded" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LimitedPreceding" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)) :+: C1 ('MetaCons "LimitedFollowing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)))) |
data WindowFrame #
Constructors
WindowBetween WindowFrameUnit FrameLength FrameLength | |
WindowFrom WindowFrameUnit FrameLength |
Instances
NFData WindowFrame | |||||
Defined in Napkin.Types.Core Methods rnf :: WindowFrame -> () # | |||||
Data WindowFrame | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WindowFrame -> c WindowFrame # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WindowFrame # toConstr :: WindowFrame -> Constr # dataTypeOf :: WindowFrame -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WindowFrame) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WindowFrame) # gmapT :: (forall b. Data b => b -> b) -> WindowFrame -> WindowFrame # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrame -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrame -> r # gmapQ :: (forall d. Data d => d -> u) -> WindowFrame -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WindowFrame -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame # | |||||
Generic WindowFrame | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show WindowFrame | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WindowFrame -> ShowS # show :: WindowFrame -> String # showList :: [WindowFrame] -> ShowS # | |||||
Eq WindowFrame | |||||
Defined in Napkin.Types.Core | |||||
Ord WindowFrame | |||||
Defined in Napkin.Types.Core Methods compare :: WindowFrame -> WindowFrame -> Ordering # (<) :: WindowFrame -> WindowFrame -> Bool # (<=) :: WindowFrame -> WindowFrame -> Bool # (>) :: WindowFrame -> WindowFrame -> Bool # (>=) :: WindowFrame -> WindowFrame -> Bool # max :: WindowFrame -> WindowFrame -> WindowFrame # min :: WindowFrame -> WindowFrame -> WindowFrame # | |||||
Lift WindowFrame | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => WindowFrame -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => WindowFrame -> Code m WindowFrame # | |||||
type Rep WindowFrame | |||||
Defined in Napkin.Types.Core type Rep WindowFrame = D1 ('MetaData "WindowFrame" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WindowBetween" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WindowFrameUnit) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FrameLength) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FrameLength))) :+: C1 ('MetaCons "WindowFrom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WindowFrameUnit) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FrameLength))) |
data WindowFrameUnit #
Constructors
WindowRows | |
WindowRange |
Instances
NFData WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods rnf :: WindowFrameUnit -> () # | |||||
Data WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WindowFrameUnit -> c WindowFrameUnit # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WindowFrameUnit # toConstr :: WindowFrameUnit -> Constr # dataTypeOf :: WindowFrameUnit -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WindowFrameUnit) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WindowFrameUnit) # gmapT :: (forall b. Data b => b -> b) -> WindowFrameUnit -> WindowFrameUnit # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrameUnit -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrameUnit -> r # gmapQ :: (forall d. Data d => d -> u) -> WindowFrameUnit -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WindowFrameUnit -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit # | |||||
Generic WindowFrameUnit | |||||
Defined in Napkin.Types.Core Associated Types
Methods from :: WindowFrameUnit -> Rep WindowFrameUnit x # to :: Rep WindowFrameUnit x -> WindowFrameUnit # | |||||
Show WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> WindowFrameUnit -> ShowS # show :: WindowFrameUnit -> String # showList :: [WindowFrameUnit] -> ShowS # | |||||
Eq WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods (==) :: WindowFrameUnit -> WindowFrameUnit -> Bool # (/=) :: WindowFrameUnit -> WindowFrameUnit -> Bool # | |||||
Ord WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods compare :: WindowFrameUnit -> WindowFrameUnit -> Ordering # (<) :: WindowFrameUnit -> WindowFrameUnit -> Bool # (<=) :: WindowFrameUnit -> WindowFrameUnit -> Bool # (>) :: WindowFrameUnit -> WindowFrameUnit -> Bool # (>=) :: WindowFrameUnit -> WindowFrameUnit -> Bool # max :: WindowFrameUnit -> WindowFrameUnit -> WindowFrameUnit # min :: WindowFrameUnit -> WindowFrameUnit -> WindowFrameUnit # | |||||
Lift WindowFrameUnit | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => WindowFrameUnit -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => WindowFrameUnit -> Code m WindowFrameUnit # | |||||
type Rep WindowFrameUnit | |||||
Constructors
WOver | |
Fields |
Instances
Default WOver | |||||
Defined in Napkin.Types.Core | |||||
NFData WOver | |||||
Defined in Napkin.Types.Core | |||||
Data WOver | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WOver -> c WOver # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WOver # dataTypeOf :: WOver -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WOver) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WOver) # gmapT :: (forall b. Data b => b -> b) -> WOver -> WOver # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WOver -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WOver -> r # gmapQ :: (forall d. Data d => d -> u) -> WOver -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WOver -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WOver -> m WOver # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WOver -> m WOver # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WOver -> m WOver # | |||||
Generic WOver | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show WOver | |||||
Eq WOver | |||||
Ord WOver | |||||
Lift WOver | |||||
type Rep WOver | |||||
Defined in Napkin.Types.Core type Rep WOver = D1 ('MetaData "WOver" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WOver" 'PrefixI 'True) (S1 ('MetaSel ('Just "_overPartition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Partition) :*: (S1 ('MetaSel ('Just "_overOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order) :*: S1 ('MetaSel ('Just "_overFrame") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WindowFrame))))) |
data Distinctness #
Constructors
Distinct | |
NonDistinct |
Instances
Default Distinctness | |||||
Defined in Napkin.Types.Core Methods def :: Distinctness # | |||||
NFData Distinctness | |||||
Defined in Napkin.Types.Core Methods rnf :: Distinctness -> () # | |||||
Data Distinctness | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Distinctness -> c Distinctness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Distinctness # toConstr :: Distinctness -> Constr # dataTypeOf :: Distinctness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Distinctness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Distinctness) # gmapT :: (forall b. Data b => b -> b) -> Distinctness -> Distinctness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Distinctness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Distinctness -> r # gmapQ :: (forall d. Data d => d -> u) -> Distinctness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Distinctness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness # | |||||
Generic Distinctness | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Distinctness | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> Distinctness -> ShowS # show :: Distinctness -> String # showList :: [Distinctness] -> ShowS # | |||||
Eq Distinctness | |||||
Defined in Napkin.Types.Core | |||||
Ord Distinctness | |||||
Defined in Napkin.Types.Core Methods compare :: Distinctness -> Distinctness -> Ordering # (<) :: Distinctness -> Distinctness -> Bool # (<=) :: Distinctness -> Distinctness -> Bool # (>) :: Distinctness -> Distinctness -> Bool # (>=) :: Distinctness -> Distinctness -> Bool # max :: Distinctness -> Distinctness -> Distinctness # min :: Distinctness -> Distinctness -> Distinctness # | |||||
CombiBomb Distinctness | |||||
Defined in Napkin.Backends.MsSql.ApiGen.Types Methods toParensOperatorArgs :: Distinctness -> [ParensOperatorArgument] # | |||||
Lift Distinctness | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => Distinctness -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => Distinctness -> Code m Distinctness # | |||||
type Rep Distinctness | |||||
data NativeExpr #
Constructors
PostgresAExpr AExpr | |
SimpleSQLParserScalarExpr ScalarExpr |
Instances
NFData NativeExpr | |||||
Defined in Napkin.Types.Core Methods rnf :: NativeExpr -> () # | |||||
Data NativeExpr | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NativeExpr -> c NativeExpr # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NativeExpr # toConstr :: NativeExpr -> Constr # dataTypeOf :: NativeExpr -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NativeExpr) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NativeExpr) # gmapT :: (forall b. Data b => b -> b) -> NativeExpr -> NativeExpr # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NativeExpr -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NativeExpr -> r # gmapQ :: (forall d. Data d => d -> u) -> NativeExpr -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NativeExpr -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr # | |||||
Generic NativeExpr | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show NativeExpr | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> NativeExpr -> ShowS # show :: NativeExpr -> String # showList :: [NativeExpr] -> ShowS # | |||||
Eq NativeExpr | |||||
Defined in Napkin.Types.Core | |||||
Ord NativeExpr | |||||
Defined in Napkin.Types.Core Methods compare :: NativeExpr -> NativeExpr -> Ordering # (<) :: NativeExpr -> NativeExpr -> Bool # (<=) :: NativeExpr -> NativeExpr -> Bool # (>) :: NativeExpr -> NativeExpr -> Bool # (>=) :: NativeExpr -> NativeExpr -> Bool # max :: NativeExpr -> NativeExpr -> NativeExpr # min :: NativeExpr -> NativeExpr -> NativeExpr # | |||||
Lift NativeExpr | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => NativeExpr -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => NativeExpr -> Code m NativeExpr # | |||||
type Rep NativeExpr | |||||
Defined in Napkin.Types.Core type Rep NativeExpr = D1 ('MetaData "NativeExpr" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresAExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AExpr)) :+: C1 ('MetaCons "SimpleSQLParserScalarExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ScalarExpr))) |
data Nullability #
Instances
NFData Nullability | |||||
Defined in Napkin.Types.Core Methods rnf :: Nullability -> () # | |||||
Data Nullability | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Nullability -> c Nullability # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Nullability # toConstr :: Nullability -> Constr # dataTypeOf :: Nullability -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Nullability) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Nullability) # gmapT :: (forall b. Data b => b -> b) -> Nullability -> Nullability # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Nullability -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Nullability -> r # gmapQ :: (forall d. Data d => d -> u) -> Nullability -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Nullability -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability # | |||||
Generic Nullability | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Nullability | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> Nullability -> ShowS # show :: Nullability -> String # showList :: [Nullability] -> ShowS # | |||||
Eq Nullability | |||||
Defined in Napkin.Types.Core | |||||
Ord Nullability | |||||
Defined in Napkin.Types.Core Methods compare :: Nullability -> Nullability -> Ordering # (<) :: Nullability -> Nullability -> Bool # (<=) :: Nullability -> Nullability -> Bool # (>) :: Nullability -> Nullability -> Bool # (>=) :: Nullability -> Nullability -> Bool # max :: Nullability -> Nullability -> Nullability # min :: Nullability -> Nullability -> Nullability # | |||||
Lift Nullability | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => Nullability -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => Nullability -> Code m Nullability # | |||||
type Rep Nullability | |||||
BigQuery array index can be 0-based or 1-based
Constructors
ArrayBase0 | |
ArrayBase1 |
Instances
NFData ArrayBase | |
Defined in Napkin.Types.Core | |
Data ArrayBase | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayBase -> c ArrayBase # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ArrayBase # toConstr :: ArrayBase -> Constr # dataTypeOf :: ArrayBase -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ArrayBase) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ArrayBase) # gmapT :: (forall b. Data b => b -> b) -> ArrayBase -> ArrayBase # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayBase -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayBase -> r # gmapQ :: (forall d. Data d => d -> u) -> ArrayBase -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayBase -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase # | |
Generic ArrayBase | |
Defined in Napkin.Types.Core | |
Show ArrayBase | |
Eq ArrayBase | |
Ord ArrayBase | |
Lift ArrayBase | |
type Rep ArrayBase | |
data IntInterval #
Constructors
IntInterval SExp DatePart |
Instances
Data IntInterval | |
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntInterval -> c IntInterval # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntInterval # toConstr :: IntInterval -> Constr # dataTypeOf :: IntInterval -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntInterval) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntInterval) # gmapT :: (forall b. Data b => b -> b) -> IntInterval -> IntInterval # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntInterval -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntInterval -> r # gmapQ :: (forall d. Data d => d -> u) -> IntInterval -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> IntInterval -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval # | |
Show IntInterval | |
Defined in Napkin.Types.Core Methods showsPrec :: Int -> IntInterval -> ShowS # show :: IntInterval -> String # showList :: [IntInterval] -> ShowS # | |
Eq IntInterval | |
Defined in Napkin.Types.Core | |
Ord IntInterval | |
Defined in Napkin.Types.Core Methods compare :: IntInterval -> IntInterval -> Ordering # (<) :: IntInterval -> IntInterval -> Bool # (<=) :: IntInterval -> IntInterval -> Bool # (>) :: IntInterval -> IntInterval -> Bool # (>=) :: IntInterval -> IntInterval -> Bool # max :: IntInterval -> IntInterval -> IntInterval # min :: IntInterval -> IntInterval -> IntInterval # | |
Val IntInterval | |
Defined in Napkin.Types.Core Methods val :: Prism' Value IntInterval # |
Intervals could internally make use of expressions
Constructors
Interval | |
Fields
|
Instances
NFData Interval | |||||
Defined in Napkin.Types.Core | |||||
Data Interval | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Interval -> c Interval # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Interval # toConstr :: Interval -> Constr # dataTypeOf :: Interval -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Interval) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Interval) # gmapT :: (forall b. Data b => b -> b) -> Interval -> Interval # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Interval -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Interval -> r # gmapQ :: (forall d. Data d => d -> u) -> Interval -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Interval -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Interval -> m Interval # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Interval -> m Interval # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Interval -> m Interval # | |||||
Generic Interval | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show Interval | |||||
Eq Interval | |||||
Ord Interval | |||||
Defined in Napkin.Types.Core | |||||
Lift Interval | |||||
type Rep Interval | |||||
Defined in Napkin.Types.Core |
data StructField #
Constructors
StructFieldSharp Int | |
StructFieldNamed Text |
Instances
NFData StructField | |||||
Defined in Napkin.Types.Core Methods rnf :: StructField -> () # | |||||
Data StructField | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StructField -> c StructField # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StructField # toConstr :: StructField -> Constr # dataTypeOf :: StructField -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StructField) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StructField) # gmapT :: (forall b. Data b => b -> b) -> StructField -> StructField # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StructField -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StructField -> r # gmapQ :: (forall d. Data d => d -> u) -> StructField -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> StructField -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> StructField -> m StructField # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StructField -> m StructField # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StructField -> m StructField # | |||||
Generic StructField | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Read StructField | |||||
Defined in Napkin.Types.Core Methods readsPrec :: Int -> ReadS StructField # readList :: ReadS [StructField] # readPrec :: ReadPrec StructField # readListPrec :: ReadPrec [StructField] # | |||||
Show StructField | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> StructField -> ShowS # show :: StructField -> String # showList :: [StructField] -> ShowS # | |||||
Eq StructField | |||||
Defined in Napkin.Types.Core | |||||
Ord StructField | |||||
Defined in Napkin.Types.Core Methods compare :: StructField -> StructField -> Ordering # (<) :: StructField -> StructField -> Bool # (<=) :: StructField -> StructField -> Bool # (>) :: StructField -> StructField -> Bool # (>=) :: StructField -> StructField -> Bool # max :: StructField -> StructField -> StructField # min :: StructField -> StructField -> StructField # | |||||
Lift StructField | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => StructField -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => StructField -> Code m StructField # | |||||
type Rep StructField | |||||
Defined in Napkin.Types.Core type Rep StructField = D1 ('MetaData "StructField" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "StructFieldSharp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "StructFieldNamed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
Select something and give it a name; e.g. (my_field as foo)
Constructors
Selected | |
Fields
|
Instances
Foldable Selected | |||||
Defined in Napkin.Types.Core Methods fold :: Monoid m => Selected m -> m # foldMap :: Monoid m => (a -> m) -> Selected a -> m # foldMap' :: Monoid m => (a -> m) -> Selected a -> m # foldr :: (a -> b -> b) -> b -> Selected a -> b # foldr' :: (a -> b -> b) -> b -> Selected a -> b # foldl :: (b -> a -> b) -> b -> Selected a -> b # foldl' :: (b -> a -> b) -> b -> Selected a -> b # foldr1 :: (a -> a -> a) -> Selected a -> a # foldl1 :: (a -> a -> a) -> Selected a -> a # elem :: Eq a => a -> Selected a -> Bool # maximum :: Ord a => Selected a -> a # minimum :: Ord a => Selected a -> a # | |||||
WithName Selected | |||||
Defined in Napkin.Types.Core | |||||
Lift a => Lift (Selected a :: Type) | |||||
NFData a => NFData (Selected a) | |||||
Defined in Napkin.Types.Core | |||||
Data a => Data (Selected a) | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Selected a -> c (Selected a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Selected a) # toConstr :: Selected a -> Constr # dataTypeOf :: Selected a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Selected a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Selected a)) # gmapT :: (forall b. Data b => b -> b) -> Selected a -> Selected a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Selected a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Selected a -> r # gmapQ :: (forall d. Data d => d -> u) -> Selected a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Selected a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) # | |||||
Generic (Selected a) | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show a => Show (Selected a) | |||||
Eq a => Eq (Selected a) | |||||
Ord a => Ord (Selected a) | |||||
HasDeps a => HasDeps (Selected a) | |||||
Defined in Napkin.Types.Deps | |||||
FunRenamer (Selected Query) | |||||
FunRenamer (Selected Relation) | |||||
TableRenamer (Selected Query) | |||||
TableRenamer (Selected Relation) | |||||
TableRenamer (Selected Table) | |||||
type Rep (Selected a) | |||||
Defined in Napkin.Types.Core type Rep (Selected a) = D1 ('MetaData "Selected" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Selected" 'PrefixI 'True) (S1 ('MetaSel ('Just "_selectRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref a)) :*: S1 ('MetaSel ('Just "_selectItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
newtype SpecTableName #
The way to refer to tasks in the spec. With renaming these can then refer to tables in a database. Once renamed, they should never be repacked into newtype. Be careful to avoid use of Constructor SpecTableName internally in Napkin. Ideally, baseTableName will only be used when renaming, but this is less of a concern.
Constructors
SpecTableName | |
Fields |
Instances
FromJSON SpecTableName | |||||
Defined in Napkin.Types.Core Methods parseJSON :: Value -> Parser SpecTableName # parseJSONList :: Value -> Parser [SpecTableName] # | |||||
FromJSONKey SpecTableName | |||||
Defined in Napkin.Types.Core | |||||
ToJSON SpecTableName | |||||
Defined in Napkin.Types.Core Methods toJSON :: SpecTableName -> Value # toEncoding :: SpecTableName -> Encoding # toJSONList :: [SpecTableName] -> Value # toEncodingList :: [SpecTableName] -> Encoding # omitField :: SpecTableName -> Bool # | |||||
ToJSONKey SpecTableName | |||||
Defined in Napkin.Types.Core Methods | |||||
Buildable SpecTableName | |||||
Defined in Napkin.Types.Core Methods build :: SpecTableName -> Builder # | |||||
Semigroup SpecTableName | |||||
Defined in Napkin.Types.Core Methods (<>) :: SpecTableName -> SpecTableName -> SpecTableName # sconcat :: NonEmpty SpecTableName -> SpecTableName # stimes :: Integral b => b -> SpecTableName -> SpecTableName # | |||||
Data SpecTableName | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpecTableName -> c SpecTableName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpecTableName # toConstr :: SpecTableName -> Constr # dataTypeOf :: SpecTableName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpecTableName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpecTableName) # gmapT :: (forall b. Data b => b -> b) -> SpecTableName -> SpecTableName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpecTableName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpecTableName -> r # gmapQ :: (forall d. Data d => d -> u) -> SpecTableName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SpecTableName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName # | |||||
IsString SpecTableName | |||||
Defined in Napkin.Types.Core Methods fromString :: String -> SpecTableName # | |||||
Generic SpecTableName | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show SpecTableName | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> SpecTableName -> ShowS # show :: SpecTableName -> String # showList :: [SpecTableName] -> ShowS # | |||||
Eq SpecTableName | |||||
Defined in Napkin.Types.Core Methods (==) :: SpecTableName -> SpecTableName -> Bool # (/=) :: SpecTableName -> SpecTableName -> Bool # | |||||
Ord SpecTableName | |||||
Defined in Napkin.Types.Core Methods compare :: SpecTableName -> SpecTableName -> Ordering # (<) :: SpecTableName -> SpecTableName -> Bool # (<=) :: SpecTableName -> SpecTableName -> Bool # (>) :: SpecTableName -> SpecTableName -> Bool # (>=) :: SpecTableName -> SpecTableName -> Bool # max :: SpecTableName -> SpecTableName -> SpecTableName # min :: SpecTableName -> SpecTableName -> SpecTableName # | |||||
AsRelation SpecTableName | |||||
Defined in Napkin.Types.Core Methods asRelation :: SpecTableName -> Relation # | |||||
TableRef SpecTableName | |||||
Defined in Napkin.Types.Core | |||||
type Rep SpecTableName | |||||
Defined in Napkin.Types.Core type Rep SpecTableName = D1 ('MetaData "SpecTableName" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "SpecTableName" 'PrefixI 'True) (S1 ('MetaSel ('Just "baseTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Table)))) |
newtype TemporaryTableName #
Constructors
TemporaryTableName (Ref Table) |
A way to refer to entities like fields, tables, schemas, etc. Namespacing is common so we keep a list here.
Instances
Lift (Ref a :: Type) | |||||
FromJSON (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
FromJSONKey (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
ToJSON (Ref a) | |||||
ToJSONKey (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
FoldCase (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
NFData (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
Buildable (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
Semigroup (Ref a) | |||||
(Typeable a, Typeable k) => Data (Ref a) | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ref a -> c (Ref a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ref a) # dataTypeOf :: Ref a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ref a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ref a)) # gmapT :: (forall b. Data b => b -> b) -> Ref a -> Ref a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ref a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ref a -> r # gmapQ :: (forall d. Data d => d -> u) -> Ref a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ref a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) # | |||||
IsString (Ref a) | |||||
Defined in Napkin.Types.Core Methods fromString :: String -> Ref a # | |||||
Generic (Ref a) | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show (Ref a) | |||||
Eq (Ref a) | |||||
Ord (Ref a) | |||||
Hashable (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
AsRelation (Ref a) | |||||
Defined in Napkin.Types.Core Methods asRelation :: Ref a -> Relation # | |||||
IsRef (Ref a) | |||||
Defined in Napkin.Types.Core | |||||
TableRef (Ref Table) | |||||
HasDeps (Ref Table) | |||||
Defined in Napkin.Types.Deps | |||||
TableRenamer (Ref Table) | |||||
Cons (Ref a) (Ref a) Name Name | |||||
Snoc (Ref a) (Ref a) Name Name | |||||
type Rep (Ref a) | |||||
Defined in Napkin.Types.Core |
Constructors
KindTable | |
KindView | |
KindMaterializedView |
Instances
Bounded TableKind | |
Enum TableKind | |
Defined in Napkin.Types.Core Methods succ :: TableKind -> TableKind # pred :: TableKind -> TableKind # fromEnum :: TableKind -> Int # enumFrom :: TableKind -> [TableKind] # enumFromThen :: TableKind -> TableKind -> [TableKind] # enumFromTo :: TableKind -> TableKind -> [TableKind] # enumFromThenTo :: TableKind -> TableKind -> TableKind -> [TableKind] # | |
Show TableKind | |
Eq TableKind | |
Ord TableKind | |
nameTextQuoted :: Name -> Text #
useSpecName :: SpecTableName -> Ref Table #
An alias for baseTableName to use when renaming. As renaming is the proper way to unpack a SpecTableName, use this when unpacking a SpecTableName for renaming (or potential renaming). A little semantic flag to demarcate proper usages.
textRefIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p Text (f Text) #
refTextIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p Text (f Text) -> p (Ref a) (f (Ref a)) #
refNameIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p (NonEmpty Name) (f (NonEmpty Name)) #
specTableText :: SpecTableName -> Text #
keywordRef :: Text -> Ref Function #
selectToAlias :: Selected a -> Alias a #
invertOrder :: OrderDir -> OrderDir #
Flip order
fromAliases :: From -> [Ref Relation] #
orderWithInserted :: WithClauses -> [(Ref Query, CteBody)] #
cteRefs :: forall {k} (a :: k). WithClauses -> Set (Ref a) #
emptyQuery :: Query #
mkUnion :: UnionType -> [Query] -> Query #
Convenience: Combine list of queries via union of the same type
collectUnionQueries :: Query -> NonEmpty Query #
Pull apart any UNIONs and extract a flat list of non-union queries.
queryFullySpecified :: Data a => a -> Bool #
Has select *
been used anywhere inside this thing? If so, False.
queryHaving :: Traversal' Query (Maybe SExp) #
queryLimit :: Traversal' Query (Maybe Int) #
queryOffset :: Traversal' Query (Maybe Int) #
querySelect :: Traversal' Query [Alias SExp] #
queryWhere :: Traversal' Query (Maybe SExp) #
_Query :: Prism' Query (WithClauses, [Alias SExp], [ColumnComment], Maybe From, Maybe ParensOperator, Maybe SExp, Maybe SExp, GroupBy, Order, Maybe Int, Maybe Int, Distinctness, AsStruct) #
_From :: Iso' From (Selected Relation, [(Selected Relation, JoinType, Either (Maybe SExp) [Ref SExp])]) #
_JoinRight :: Prism' JoinType () #
_JoinInner :: Prism' JoinType () #
_JoinCross :: Prism' JoinType () #
_JoinOuter :: Prism' JoinType () #
unRef :: forall k1 (a1 :: k1) k2 (a2 :: k2) p f. (Profunctor p, Functor f) => p (NonEmpty Name) (f (NonEmpty Name)) -> p (Ref a1) (f (Ref a2)) #
_Millennium :: Prism' DatePart () #
_DayOfWeek :: Prism' DatePart () #
_DayOfYear :: Prism' DatePart () #
_Millisecond :: Prism' DatePart () #
_Microsecond :: Prism' DatePart () #
_ArraySelect :: Prism' SExp Query #
_ArrayItem :: Prism' SExp (ArrayBase, Nullability, SExp, SExp) #
_FieldAccess :: Prism' SExp (SExp, StructField) #
selectItem :: forall a f. Functor f => (a -> f a) -> Selected a -> f (Selected a) #
aliasRef :: forall a f. Functor f => (Maybe (Ref a) -> f (Maybe (Ref a))) -> Alias a -> f (Alias a) #
unName :: Traversal' Name Text #
data UpdateQuery #
Constructors
UpdateQuery | |
Fields |
Instances
NFData UpdateQuery | |||||
Defined in Napkin.Types.Core Methods rnf :: UpdateQuery -> () # | |||||
Data UpdateQuery | |||||
Defined in Napkin.Types.Core Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateQuery -> c UpdateQuery # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateQuery # toConstr :: UpdateQuery -> Constr # dataTypeOf :: UpdateQuery -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateQuery) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateQuery) # gmapT :: (forall b. Data b => b -> b) -> UpdateQuery -> UpdateQuery # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateQuery -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateQuery -> r # gmapQ :: (forall d. Data d => d -> u) -> UpdateQuery -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateQuery -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery # | |||||
Generic UpdateQuery | |||||
Defined in Napkin.Types.Core Associated Types
| |||||
Show UpdateQuery | |||||
Defined in Napkin.Types.Core Methods showsPrec :: Int -> UpdateQuery -> ShowS # show :: UpdateQuery -> String # showList :: [UpdateQuery] -> ShowS # | |||||
Eq UpdateQuery | |||||
Defined in Napkin.Types.Core | |||||
Ord UpdateQuery | |||||
Defined in Napkin.Types.Core Methods compare :: UpdateQuery -> UpdateQuery -> Ordering # (<) :: UpdateQuery -> UpdateQuery -> Bool # (<=) :: UpdateQuery -> UpdateQuery -> Bool # (>) :: UpdateQuery -> UpdateQuery -> Bool # (>=) :: UpdateQuery -> UpdateQuery -> Bool # max :: UpdateQuery -> UpdateQuery -> UpdateQuery # min :: UpdateQuery -> UpdateQuery -> UpdateQuery # | |||||
HasDeps UpdateQuery | |||||
Defined in Napkin.Types.Deps Methods dependenciesSet :: UpdateQuery -> Set (Ref Table) # | |||||
Lift UpdateQuery | |||||
Defined in Napkin.Types.Core Methods lift :: Quote m => UpdateQuery -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => UpdateQuery -> Code m UpdateQuery # | |||||
type Rep UpdateQuery | |||||
Defined in Napkin.Types.Core type Rep UpdateQuery = D1 ('MetaData "UpdateQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "UpdateQuery" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_updateQueryTarget") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias (Ref Table))) :*: S1 ('MetaSel ('Just "_updateQuerySet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap Name SExp))) :*: (S1 ('MetaSel ('Just "_updateQueryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: S1 ('MetaSel ('Just "_updateQueryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp))))) |
Instances
TableRef SpecTableName | |
Defined in Napkin.Types.Core | |
TableRef (CreateTableAs m) # | |
Defined in Napkin.Spec.Types.CreateTableAs | |
TableRef (Ref Table) | |
_WithClauses :: Iso' WithClauses (Bool, OMap (Ref Query) CteBody) #
refNamespace :: forall {k} (a :: k) f. Functor f => (Maybe Name -> f (Maybe Name)) -> Ref a -> f (Ref a) #
Monomorphic converter to make it easy to type string literals under OverloadedStrings
fullWindow :: WOver #
Convenient starting point for full window (unbounded) for cases where not specifying window defaults to a partial window. (E.g. BigQuery)
relationRef :: TableRef a => Getter a Relation #
varAs :: forall {k} (a :: k). Ref a -> Selected SExp #
Polymorphic to support refs that come out of Relations, etc.
asSelf :: SExp -> Selected SExp #
"Note that this is a partial function and will work only for SExps that are Var's. Please prefer varAs or as
when possible
funAs :: (SExp -> b) -> Ref b -> Selected b #
Apply function to a Ref and select it by the same name as the ref. Common use case in SELECT queries.
selectToRef :: Selected SExp -> SExp #
Use the name of a Selected
as a reference. Typically when
you've computed a field in a subquery or a previous table, and
you're now using that computation directly via its name.
selectedExps :: forall a f. Applicative f => (a -> f a) -> [Selected a] -> f [Selected a] #
selectedNames :: forall a0 f. Applicative f => (Text -> f Text) -> [Selected a0] -> f [Selected a0] #
refName :: forall {k1} {k2} (a :: k1) (a1 :: k2) f. Applicative f => (Text -> f Text) -> Ref a -> f (Ref a1) #
Pull the last name out of a Ref. E.g. if Ref contains a schema.table_name, pull just the table_name out.
refRoot :: forall {k} (a :: k) f. Functor f => (Name -> f Name) -> Ref a -> f (Ref a) #
Get final segments on the ref path and grab the name
refJustRoot :: forall {k} (a :: k). Ref a -> Ref a #
selectedName :: forall a f. Applicative f => (Name -> f Name) -> Selected a -> f (Selected a) #
aliasedNames :: HasDefinition s => Traversal' s (Ref SExp) #
viewAliasedNames :: (Applicative f, Contravariant f, MaybeQuery s) => (Ref SExp -> f (Ref SExp)) -> s -> f s #
scopeRefs :: forall {k} b (t :: k). Data b => Ref t -> b -> b #
Attach all column references within expression to given (table) reference. Note this would replace both their use as variables and in naming the aliases.
scopeExps :: forall {k} b (t :: k). Data b => Ref t -> b -> b #
Modify all variable references in the given object to use the given reference as the hierarchical source of the variable. Useful when pointing all variables to belong to a given relationtablename in a context.
modifyExterns :: Data b => (ExternFun -> SExp) -> b -> b #
type SpecsDepsTables = Map SpecTableName (Set SpecDependency) #
Constructors
TableNode SpecTableName | |
GlobalHookNode Text |
pattern NapkinTableSeparator :: (Eq a, IsString a) => a #
pattern NapkinTablePrefix :: (Eq a, IsString a) => a #
updateQuerySet :: Lens' UpdateQuery (OMap Name SExp) #
updateQueryTarget :: Lens' UpdateQuery (Alias (Ref Table)) #
isTemporaryTable :: Ref Table -> Bool #
tmpTableNameFormat :: UTCTime -> Text -> Text #
Temporary tables name format: _np_POSIXtimestamp_token[_tablename], timestamps are used for temporary tables cleanup command
getUTCTimeTemporaryTable :: Ref Table -> Maybe UTCTime #
extracts timestamp from temporary tables name format (tmpTableNameFormat function): _np_day-utc-timestamp_seconds-utc-timestamp_token[_tablename]
getTemporaryTableName :: forall {k} m (b :: k). MonadIO m => m (Ref b) #
specNodeText :: SpecNode -> Text #
class FunRenamer a where #
Instances
FunRenamer CteBody | |
FunRenamer ExternFun | |
FunRenamer From | |
FunRenamer OrderPart | |
FunRenamer Query | |
FunRenamer Relation | |
FunRenamer SExp | |
FunRenamer WithClauses | |
Defined in Napkin.Types.QueryTransformer Methods renameFun :: (Ref Function -> Ref Function) -> WithClauses -> WithClauses # | |
FunRenamer (Alias SExp) | |
FunRenamer (Selected Query) | |
FunRenamer (Selected Relation) | |
class TableRenamer a where #
Instances
TableRenamer CteBody | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer ExternFun | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer From | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer OrderPart | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer Query | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer Relation | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer SExp | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer WithClauses | |
Defined in Napkin.Types.QueryTransformer Methods renameTableRef :: (Ref Table -> Ref Table) -> WithClauses -> WithClauses # | |
TableRenamer Statement | |
Defined in Napkin.Types.QueryTransformer | |
TableRenamer (Alias SExp) | |
TableRenamer (Alias Table) | |
TableRenamer (Selected Query) | |
TableRenamer (Selected Relation) | |
TableRenamer (Selected Table) | |
TableRenamer (Ref Table) | |
data QueryTransformerUnit #
Constructors
TableRenamer (Ref Table -> Ref Table) | |
FunctionRenamer (Ref Function -> Ref Function) | |
QueryRewriter (Query -> Query) |
type QueryTransformer = [QueryTransformerUnit] #
isTableRenamer :: QueryTransformerUnit -> Maybe (Ref Table -> Ref Table) #
qt_spec :: Getter QueryTransformer (SpecTableName -> Ref Table) #
In general this should be used for renaming SpecTableName.
qt_data :: Data a => Getter QueryTransformer (a -> a) #
Class of things that have external table dependencies
Minimal complete definition
Methods
dependenciesSet :: a -> Set (Ref Table) #
traverseDependencies :: Fold a (Ref Table) #
default traverseDependencies :: Fold a (Ref Table) #
Instances
HasDeps CteBody | |
Defined in Napkin.Types.Deps | |
HasDeps ExternFun | |
Defined in Napkin.Types.Deps | |
HasDeps From | |
Defined in Napkin.Types.Deps | |
HasDeps Query | |
Defined in Napkin.Types.Deps | |
HasDeps Relation | |
Defined in Napkin.Types.Deps | |
HasDeps SExp | |
Defined in Napkin.Types.Deps | |
HasDeps UpdateQuery | |
Defined in Napkin.Types.Deps Methods dependenciesSet :: UpdateQuery -> Set (Ref Table) # | |
HasDeps WithClauses | |
Defined in Napkin.Types.Deps Methods dependenciesSet :: WithClauses -> Set (Ref Table) # | |
HasDeps (CreateTableAs m) # | |
Defined in Napkin.Spec.Types.CreateTableAs Methods dependenciesSet :: CreateTableAs m -> Set (Ref Table) # traverseDependencies :: Fold (CreateTableAs m) (Ref Table) # | |
HasDeps (Alias SExp) | |
Defined in Napkin.Types.Deps | |
HasDeps a => HasDeps (Selected a) | |
Defined in Napkin.Types.Deps | |
HasDeps a => HasDeps (Maybe a) | |
Defined in Napkin.Types.Deps | |
HasDeps a => HasDeps [a] | |
Defined in Napkin.Types.Deps | |
HasDeps (Ref Table) | |
Defined in Napkin.Types.Deps | |
HasDeps (OMap Name SExp) | |
type family Members (es :: [Effect]) (r :: EffectRow) where ... #
Makes constraints of functions that use multiple effects shorter by
translating single list of effects into multiple Member
constraints:
foo ::Members
'[Output
Int ,Output
Bool ,State
String ] r =>Sem
r ()
translates into:
foo :: (Member
(Output
Int) r ,Member
(Output
Bool) r ,Member
(State
String) r ) =>Sem
r ()
Since: polysemy-0.1.2.0
The Sem
monad handles computations of arbitrary extensible effects.
A value of type Sem r
describes a program with the capabilities of
r
. For best results, r
should always be kept polymorphic, but you can
add capabilities via the Member
constraint.
The value of the Sem
monad is that it allows you to write programs
against a set of effects without a predefined meaning, and provide that
meaning later. For example, unlike with mtl, you can decide to interpret an
Error
effect traditionally as an Either
, or instead
as (a significantly faster) IO
Exception
. These
interpretations (and others that you might add) may be used interchangeably
without needing to write any newtypes or Monad
instances. The only
change needed to swap interpretations is to change a call from
runError
to errorToIOFinal
.
The effect stack r
can contain arbitrary other monads inside of it. These
monads are lifted into effects via the Embed
effect. Monadic values can be
lifted into a Sem
via embed
.
Higher-order actions of another monad can be lifted into higher-order actions
of Sem
via the Final
effect, which is more powerful
than Embed
, but also less flexible to interpret.
A Sem
can be interpreted as a pure value (via run
) or as any
traditional Monad
(via runM
or runFinal
).
Each effect E
comes equipped with some interpreters of the form:
runE ::Sem
(E ': r) a ->Sem
r a
which is responsible for removing the effect E
from the effect stack. It
is the order in which you call the interpreters that determines the
monomorphic representation of the r
parameter.
Order of interpreters can be important - it determines behaviour of effects that manipulate state or change control flow. For example, when interpreting this action:
>>>
:{
example :: Members '[State String, Error String] r => Sem r String example = do put "start" let throwing, catching :: Members '[State String, Error String] r => Sem r String throwing = do modify (++"-throw") throw "error" get catching = do modify (++"-catch") get catch @String throwing (\ _ -> catching) :}
when handling Error
first, state is preserved after error
occurs:
>>>
:{
example & runError & fmap (either id id) & evalState "" & runM & (print =<<) :} "start-throw-catch"
while handling State
first discards state in such cases:
>>>
:{
example & evalState "" & runError & fmap (either id id) & runM & (print =<<) :} "start-catch"
A good rule of thumb is to handle effects which should have "global" behaviour over other effects later in the chain.
After all of your effects are handled, you'll be left with either
a
, a Sem
'[] a
, or a Sem
'[ Embed
m ] a
value, which can be consumed respectively by Sem
'[ Final
m ] arun
, runM
, and
runFinal
.
Examples
As an example of keeping r
polymorphic, we can consider the type
Member
(State
String) r =>Sem
r ()
to be a program with access to
get
::Sem
r Stringput
:: String ->Sem
r ()
methods.
By also adding a
Member
(Error
Bool) r
constraint on r
, we gain access to the
throw
:: Bool ->Sem
r acatch
::Sem
r a -> (Bool ->Sem
r a) ->Sem
r a
functions as well.
In this sense, a
constraint is
analogous to mtl's Member
(State
s) r
and should
be thought of as such. However, unlike mtl, a MonadState
s mSem
monad may have
an arbitrary number of the same effect.
For example, we can write a Sem
program which can output either
Int
s or Bool
s:
foo :: (Member
(Output
Int) r ,Member
(Output
Bool) r ) =>Sem
r () foo = dooutput
@Int 5output
True
Notice that we must use -XTypeApplications
to specify that we'd like to
use the (Output
Int
) effect.
Since: polysemy-0.1.2.0
Instances
Member (Embed IO) r => MonadIO (Sem r) | This instance will only lift |
Defined in Polysemy.Internal | |
Member NonDet r => Alternative (Sem r) | |
Applicative (Sem f) | |
Functor (Sem f) | |
Monad (Sem f) | |
Member NonDet r => MonadPlus (Sem r) | Since: polysemy-0.2.1.0 |
Member (Fail :: (Type -> Type) -> Type -> Type) r => MonadFail (Sem r) | Since: polysemy-1.1.0.0 |
Defined in Polysemy.Internal | |
Member Fixpoint r => MonadFix (Sem r) | |
Defined in Polysemy.Internal | |
Monoid a => Monoid (Sem f a) | Since: polysemy-1.6.0.0 |
Semigroup a => Semigroup (Sem f a) | Since: polysemy-1.6.0.0 |
class Member (t :: Effect) (r :: EffectRow) #
This class indicates that an effect must be present in the caller's stack. It is the main mechanism by which a program defines its effect dependencies.
Minimal complete definition
membership'
Instances
Member t z => Member t (_1 ': z) | |
Defined in Polysemy.Internal.Union Methods membership' :: ElemOf t (_1 ': z) | |
Member t (t ': z) | |
Defined in Polysemy.Internal.Union Methods membership' :: ElemOf t (t ': z) |
QuasiQuoter
for declaring a Query
in generic ansi2011 backend with TemplateHaskell
ansi2011SQLSExp :: QuasiQuoter #
QuasiQuoter
for declaring a SExp
in generic ansi2011 backend with TemplateHaskell
newtype SqlTemplateVariables #
Constructors
SqlTemplateVariables | |
Fields |
Instances
FromJSON SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods parseJSON :: Value -> Parser SqlTemplateVariables # parseJSONList :: Value -> Parser [SqlTemplateVariables] # | |
ToJSON SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods toJSON :: SqlTemplateVariables -> Value # toEncoding :: SqlTemplateVariables -> Encoding # toJSONList :: [SqlTemplateVariables] -> Value # toEncodingList :: [SqlTemplateVariables] -> Encoding # omitField :: SqlTemplateVariables -> Bool # | |
Default SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods | |
Monoid SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods mempty :: SqlTemplateVariables # mappend :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # | |
Semigroup SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods (<>) :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # sconcat :: NonEmpty SqlTemplateVariables -> SqlTemplateVariables # stimes :: Integral b => b -> SqlTemplateVariables -> SqlTemplateVariables # | |
Show SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods showsPrec :: Int -> SqlTemplateVariables -> ShowS # show :: SqlTemplateVariables -> String # showList :: [SqlTemplateVariables] -> ShowS # | |
Eq SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods (==) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # (/=) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # | |
Ord SqlTemplateVariables | |
Defined in Napkin.Parse.Interpolation.Types Methods compare :: SqlTemplateVariables -> SqlTemplateVariables -> Ordering # (<) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # (<=) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # (>) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # (>=) :: SqlTemplateVariables -> SqlTemplateVariables -> Bool # max :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # min :: SqlTemplateVariables -> SqlTemplateVariables -> SqlTemplateVariables # |
sqlTemplate :: [(Text, Value)] -> SqlTemplateVariables #
type FatalError = Error FatalErrorInfo :: (k -> Type) -> k -> Type #
data FatalErrorInfo #
Constructors
FatalError Text | |
BackendError SomeException |
fatalError :: forall (r :: EffectRow) a. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Text -> Sem r a #
orFatalErrorME :: forall (r :: EffectRow) e' v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Either e' v) -> (e' -> Text) -> Sem r v #
orFatalErrorM :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Maybe v) -> Text -> Sem r v #
orFatalError :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Maybe v -> Text -> Sem r v #
data ExternalCommand #
Constructors
ShellScript Text | |
CommandWithArguments Text [Text] |
Instances
Show ExternalCommand | |
Defined in Napkin.Run.Effects.Languages.External Methods showsPrec :: Int -> ExternalCommand -> ShowS # show :: ExternalCommand -> String # showList :: [ExternalCommand] -> ShowS # | |
Eq ExternalCommand | |
Defined in Napkin.Run.Effects.Languages.External Methods (==) :: ExternalCommand -> ExternalCommand -> Bool # (/=) :: ExternalCommand -> ExternalCommand -> Bool # |
executeExternalCommand' :: forall (r :: EffectRow). Member (External :: (Type -> Type) -> Type -> Type) r => ExternalCommand -> Sem r (Either Text ExitCode) #
executeExternalCommand :: forall (effs :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type] effs => ExternalCommand -> Sem effs () #
newtype LocalFileError #
Constructors
LocalFileError Text |
Instances
Show LocalFileError | |
Defined in Napkin.Run.Effects.Languages.LocalFile Methods showsPrec :: Int -> LocalFileError -> ShowS # show :: LocalFileError -> String # showList :: [LocalFileError] -> ShowS # | |
Eq LocalFileError | |
Defined in Napkin.Run.Effects.Languages.LocalFile Methods (==) :: LocalFileError -> LocalFileError -> Bool # (/=) :: LocalFileError -> LocalFileError -> Bool # |
loadFile :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> FilePath -> SqlTemplateVariables -> Sem r a #
logNotice :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logWarning :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logCritical :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logAlert :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logEmergency :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #
logDebug' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logInfo' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logNotice' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logWarning' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logError' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logCritical' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logAlert' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
logEmergency' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #
runLogKatip :: forall (m :: Type -> Type) (r :: EffectRow) a. (Katip m, Member (Embed m) r) => SimpleLogPayload -> Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a #
runLogDiscard :: forall (r :: [(Type -> Type) -> Type -> Type]) a. Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a #
newtype AssertionLog #
Constructors
AssertionLog [AssertionEntry] |
Instances
Monoid AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods mempty :: AssertionLog # mappend :: AssertionLog -> AssertionLog -> AssertionLog # mconcat :: [AssertionLog] -> AssertionLog # | |||||
Semigroup AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods (<>) :: AssertionLog -> AssertionLog -> AssertionLog # sconcat :: NonEmpty AssertionLog -> AssertionLog # stimes :: Integral b => b -> AssertionLog -> AssertionLog # | |||||
Generic AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Associated Types
| |||||
Show AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionLog -> ShowS # show :: AssertionLog -> String # showList :: [AssertionLog] -> ShowS # | |||||
Eq AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion | |||||
type Rep AssertionLog | |||||
Defined in Napkin.Run.Effects.Languages.Assertion type Rep AssertionLog = D1 ('MetaData "AssertionLog" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionLog" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AssertionEntry]))) |
newtype AssertionGroup #
Constructors
AssertionGroup [Text] |
Instances
Default AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods def :: AssertionGroup # | |||||
Monoid AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods mappend :: AssertionGroup -> AssertionGroup -> AssertionGroup # mconcat :: [AssertionGroup] -> AssertionGroup # | |||||
Semigroup AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods (<>) :: AssertionGroup -> AssertionGroup -> AssertionGroup # sconcat :: NonEmpty AssertionGroup -> AssertionGroup # stimes :: Integral b => b -> AssertionGroup -> AssertionGroup # | |||||
Generic AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Associated Types
Methods from :: AssertionGroup -> Rep AssertionGroup x # to :: Rep AssertionGroup x -> AssertionGroup # | |||||
Show AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods showsPrec :: Int -> AssertionGroup -> ShowS # show :: AssertionGroup -> String # showList :: [AssertionGroup] -> ShowS # | |||||
Eq AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion Methods (==) :: AssertionGroup -> AssertionGroup -> Bool # (/=) :: AssertionGroup -> AssertionGroup -> Bool # | |||||
type Rep AssertionGroup | |||||
Defined in Napkin.Run.Effects.Languages.Assertion type Rep AssertionGroup = D1 ('MetaData "AssertionGroup" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionGroup" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text]))) |
pattern FailureWithMessage :: Text -> AssertionStatus #
prettyPrintAssertionGroup :: AssertionGroup -> Text -> Text #
hasFailedAssertions :: AssertionLog -> Bool #
filterFailedAssertions :: AssertionLog -> [Text] #
isFailure :: AssertionEntry -> Bool #
assert' :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Sem r () #
Assertions are run-time checks based on actual results that may be returned by various operations. Dry runs may ignore these failures, but they're respected in real operations.
successIsTrue :: Bool -> AssertionStatus #
assertTrue :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r () #
assertEquals :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r) => Text -> a -> a -> Sem r () #
assertEquals' :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r, Show a) => Text -> a -> a -> Sem r () #
assertTrueWith :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Text -> Sem r () #
assertTrueWithM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r Text -> Sem r () #
failedAssertion :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r () #
warnOnly :: forall (r :: EffectRow) a. Member (Assertion :: (Type -> Type) -> Type -> Type) r => Sem r a -> Sem r a #
describe' :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => [Text] -> Sem r a -> Sem r a #
assertionToAssertionEntry :: forall {k} (r :: k) a. Assertion r a -> AssertionEntry #
data NapkinEffectError #
Instances
Exception NapkinEffectError | |
Defined in Napkin.Run.Effects.Languages.NapkinError Methods toException :: NapkinEffectError -> SomeException # fromException :: SomeException -> Maybe NapkinEffectError # | |
Show NapkinEffectError | |
Defined in Napkin.Run.Effects.Languages.NapkinError Methods showsPrec :: Int -> NapkinEffectError -> ShowS # show :: NapkinEffectError -> String # showList :: [NapkinEffectError] -> ShowS # | |
Eq NapkinEffectError | |
Defined in Napkin.Run.Effects.Languages.NapkinError Methods (==) :: NapkinEffectError -> NapkinEffectError -> Bool # (/=) :: NapkinEffectError -> NapkinEffectError -> Bool # |
type SqlIO (m :: Type -> Type) = MonadCatch m #
safeIO :: forall m (r :: EffectRow) v. (Members '[FatalError :: (Type -> Type) -> Type -> Type, Embed m] r, SqlIO m) => m v -> Sem r v #
data SqlRead (b :: k) (m :: k1) a where #
Constructors
RunQuery :: forall {k} {k1} (b :: k) (m :: k1). Query -> SqlRead b m [Map Text Value] | |
CheckTableExists :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m Bool | |
GetTableKind :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m TableKind | |
GetRelationSchema' :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Relation -> SqlRead b m [BackendSchemaField b] |
Instances
(IsRenderable Query b, IsRenderable SExp b, IsRenderable Text b) => ToDumpItem (b :: k) (SqlRead b :: (Type -> Type) -> Type -> Type) | |
GShow (SqlRead b m :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.SqlRead Methods gshowsPrec :: Int -> SqlRead b m a -> ShowS # | |
Show (SqlRead b m a) | |
Eq (SqlRead b m a) | |
newtype SchemaDiffError (bk :: k) #
Constructors
SchemaDiffError (NonEmpty (BackendSchemaField bk)) |
data SchemaDiff (bk :: k) #
Constructors
SchemaDiff | |
Fields
|
Instances
Generic (SchemaDiff bk) | |||||
Defined in Napkin.Run.Effects.Languages.SqlRead Associated Types
Methods from :: SchemaDiff bk -> Rep (SchemaDiff bk) x # to :: Rep (SchemaDiff bk) x -> SchemaDiff bk # | |||||
type Rep (SchemaDiff bk) | |||||
Defined in Napkin.Run.Effects.Languages.SqlRead type Rep (SchemaDiff bk) = D1 ('MetaData "SchemaDiff" "Napkin.Run.Effects.Languages.SqlRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SchemaDiff" 'PrefixI 'True) (S1 ('MetaSel ('Just "droppedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk]) :*: S1 ('MetaSel ('Just "addedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk]))) |
runQuery :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Query -> Sem r [Map Text Value] #
getTableKind :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableKind #
getRelationSchema' :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Relation -> Sem r [BackendSchemaField b] #
runQuerySingleAnswer :: forall {k} (b :: k) a (r :: EffectRow). (Member (SqlRead b :: (Type -> Type) -> Type -> Type) r, Val a) => Query -> Sem r (Maybe a) #
Run a query and pull out the first column from its first row. Meant for queries that return a single result.
getRelationSchema :: forall {k} (b :: k) (r :: EffectRow). Members '[SqlRead b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type] r => Relation -> Sem r [BackendSchemaField b] #
diffRelationSchemas :: forall {k} (b :: k). HasBackendSchemaField b => [BackendSchemaField b] -> [BackendSchemaField b] -> Either (SchemaDiffError b) (SchemaDiff b) #
data SqlRender (m :: k) a where #
Constructors
RenderSExp :: forall {k} (m :: k). SExp -> SqlRender m Text | |
RenderQuery :: forall {k} (m :: k). Query -> SqlRender m Text |
Instances
GShow (SqlRender a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.SqlRender Methods gshowsPrec :: Int -> SqlRender a a0 -> ShowS # | |
CacheableEffect (SqlRender :: k -> Type -> Type) SqlRenderCacheKey | |
Defined in Napkin.Run.Effects.Languages.SqlRender Methods | |
Show (SqlRender a b) | |
Eq (SqlRender m a) | |
Ord (SqlRender m a) | |
Defined in Napkin.Run.Effects.Languages.SqlRender Methods compare :: SqlRender m a -> SqlRender m a -> Ordering # (<) :: SqlRender m a -> SqlRender m a -> Bool # (<=) :: SqlRender m a -> SqlRender m a -> Bool # (>) :: SqlRender m a -> SqlRender m a -> Bool # (>=) :: SqlRender m a -> SqlRender m a -> Bool # |
data SqlRenderCacheKey #
Instances
CacheableEffect (SqlRender :: k -> Type -> Type) SqlRenderCacheKey | |
Defined in Napkin.Run.Effects.Languages.SqlRender Methods |
renderSExp :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => SExp -> Sem r SqlText #
data Template (m :: k) a where #
Constructors
Substitute :: forall {k} (m :: k). SourceLocation -> Text -> SqlTemplateVariables -> Template m (Either TemplateError Text) |
newtype TemplateError #
Constructors
TemplateError Text |
Instances
Show TemplateError | |
Defined in Napkin.Run.Effects.Languages.Template Methods showsPrec :: Int -> TemplateError -> ShowS # show :: TemplateError -> String # showList :: [TemplateError] -> ShowS # | |
Eq TemplateError | |
Defined in Napkin.Run.Effects.Languages.Template Methods (==) :: TemplateError -> TemplateError -> Bool # (/=) :: TemplateError -> TemplateError -> Bool # |
data SqlParse (m :: k) a where #
Constructors
ParseSqlQuery' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError Query) | |
ParseSqlExp' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError SExp) | |
ParseSqlStatements' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError [Statement]) |
Instances
GShow (SqlParse a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods gshowsPrec :: Int -> SqlParse a a0 -> ShowS # | |
CacheableEffect (SqlParse :: k -> Type -> Type) SqlParseCacheKey | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods | |
Show (SqlParse m a) | |
Eq (SqlParse m a) | |
Ord (SqlParse m a) | |
Defined in Napkin.Run.Effects.Languages.SqlParse |
data SqlParseCacheKey #
Instances
CacheableEffect (SqlParse :: k -> Type -> Type) SqlParseCacheKey | |
Defined in Napkin.Run.Effects.Languages.SqlParse Methods |
Methods
toStatement :: a -> Statement #
fromStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Statement -> Sem r a #
refTableLens :: Lens' a (Ref Table) #
Instances
Stateable CreateTableDDL | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods toStatement :: CreateTableDDL -> Statement # fromStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Statement -> Sem r CreateTableDDL # refTableLens :: Lens' CreateTableDDL (Ref Table) # | |
Stateable InsertStatement | |
Defined in Napkin.Run.Effects.Languages.StatementParse Methods toStatement :: InsertStatement -> Statement # fromStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Statement -> Sem r InsertStatement # |
parseSqlQuery' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError Query) #
parseSqlExp' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError SExp) #
parseSqlStatements' :: forall (r :: EffectRow). Member (SqlParse :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> Sem r (Either SqlParseError [Statement]) #
parseSqlQuery :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r Query #
parseSqlExp :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r SExp #
parseStatements :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => SourceLocation -> Text -> Sem r [a] #
overrideDialect :: forall (r :: EffectRow) a. Member (Reader SQLDialect) r => SQLDialect -> Sem r a -> Sem r a #
data ExtendedStatement #
Constructors
ExtendedStatement | |
Fields
|
Instances
Generic ExtendedStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Associated Types
Methods from :: ExtendedStatement -> Rep ExtendedStatement x # to :: Rep ExtendedStatement x -> ExtendedStatement # | |||||
Show ExtendedStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods showsPrec :: Int -> ExtendedStatement -> ShowS # show :: ExtendedStatement -> String # showList :: [ExtendedStatement] -> ShowS # | |||||
Eq ExtendedStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse Methods (==) :: ExtendedStatement -> ExtendedStatement -> Bool # (/=) :: ExtendedStatement -> ExtendedStatement -> Bool # | |||||
type Rep ExtendedStatement | |||||
Defined in Napkin.Run.Effects.Languages.StatementParse type Rep ExtendedStatement = D1 ('MetaData "ExtendedStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "ExtendedStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ddl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CreateTableDDL) :*: S1 ('MetaSel ('Just "inserts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [InsertStatement]))) |
insertStatementToQuery :: InsertStatement -> ([Text], Query) #
parseExtendedStatement :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r ExtendedStatement #
data SqlWrite b (m :: k) a where #
Constructors
CreateTableAsWithMeta :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> Query -> SqlWrite b m () | |
CreateViewAsWithMeta :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> SqlWrite b m () | |
CreateMaterializedViewAsWithMeta :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> SqlWrite b m () | |
InsertInto :: forall {k} b (m :: k). Ref Table -> InsertColumnsList -> Query -> SqlWrite b m () | |
UpdateTable :: forall {k} b (m :: k). UpdateQuery -> SqlWrite b m () | |
RenameTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> SqlWrite b m () | |
CopyTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> TableWriteStrategy -> SqlWrite b m () | |
DropTable :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () | |
DropView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () | |
DropMaterializedView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () | |
DeleteFrom :: forall {k} b (m :: k). Ref Table -> SExp -> SqlWrite b m () | |
CreateTable :: forall {k} b (m :: k). BackendTableMeta b -> CreateTableDDL -> SqlWrite b m () | |
DropColumn :: forall {k} b (m :: k). Ref Table -> Text -> SqlWrite b m () | |
AddColumn :: forall {k} b (m :: k). Ref Table -> Text -> Type -> SqlWrite b m () |
Instances
(Default (BackendTableMeta b), Default (BackendViewMeta b), Eq (BackendTableMeta b), Eq (BackendViewMeta b), Eq (YamlBackendMaterializedViewMeta b), IsRenderable Query b, IsRenderable SExp b, IsRenderable Statement b, IsRenderable Text b, IsRenderable UpdateQuery b, MaybeDefault (YamlBackendMaterializedViewMeta b), Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => ToDumpItem (b :: Type) (SqlWrite b :: (Type -> Type) -> Type -> Type) | |
(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => GShow (SqlWrite bk a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods gshowsPrec :: Int -> SqlWrite bk a a0 -> ShowS # | |
(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => Show (SqlWrite bk a b) | |
(Eq (BackendMaterializedViewMeta bk), Eq (BackendTableMeta bk), Eq (BackendViewMeta bk)) => Eq (SqlWrite bk a b) | |
data InsertColumnsList #
Instances
Default InsertColumnsList | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods | |||||
IsList InsertColumnsList | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Associated Types
Methods fromList :: [Item InsertColumnsList] -> InsertColumnsList # fromListN :: Int -> [Item InsertColumnsList] -> InsertColumnsList # toList :: InsertColumnsList -> [Item InsertColumnsList] # | |||||
Show InsertColumnsList | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> InsertColumnsList -> ShowS # show :: InsertColumnsList -> String # showList :: [InsertColumnsList] -> ShowS # | |||||
Eq InsertColumnsList | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: InsertColumnsList -> InsertColumnsList -> Bool # (/=) :: InsertColumnsList -> InsertColumnsList -> Bool # | |||||
type Item InsertColumnsList | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite |
data MissingBehavior #
Constructors
IgnoreMissing | |
FailMissing |
Instances
Show MissingBehavior | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> MissingBehavior -> ShowS # show :: MissingBehavior -> String # showList :: [MissingBehavior] -> ShowS # | |
Eq MissingBehavior | |
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: MissingBehavior -> MissingBehavior -> Bool # (/=) :: MissingBehavior -> MissingBehavior -> Bool # |
data TableWriteStrategy #
Instances
FromJSON TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods parseJSON :: Value -> Parser TableWriteStrategy # parseJSONList :: Value -> Parser [TableWriteStrategy] # | |||||
ToJSON TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods toJSON :: TableWriteStrategy -> Value # toEncoding :: TableWriteStrategy -> Encoding # toJSONList :: [TableWriteStrategy] -> Value # toEncodingList :: [TableWriteStrategy] -> Encoding # omitField :: TableWriteStrategy -> Bool # | |||||
Data TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableWriteStrategy -> c TableWriteStrategy # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableWriteStrategy # toConstr :: TableWriteStrategy -> Constr # dataTypeOf :: TableWriteStrategy -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableWriteStrategy) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableWriteStrategy) # gmapT :: (forall b. Data b => b -> b) -> TableWriteStrategy -> TableWriteStrategy # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableWriteStrategy -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableWriteStrategy -> r # gmapQ :: (forall d. Data d => d -> u) -> TableWriteStrategy -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TableWriteStrategy -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy # | |||||
Bounded TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite | |||||
Enum TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods succ :: TableWriteStrategy -> TableWriteStrategy # pred :: TableWriteStrategy -> TableWriteStrategy # toEnum :: Int -> TableWriteStrategy # fromEnum :: TableWriteStrategy -> Int # enumFrom :: TableWriteStrategy -> [TableWriteStrategy] # enumFromThen :: TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # enumFromTo :: TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # enumFromThenTo :: TableWriteStrategy -> TableWriteStrategy -> TableWriteStrategy -> [TableWriteStrategy] # | |||||
Generic TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Associated Types
Methods from :: TableWriteStrategy -> Rep TableWriteStrategy x # to :: Rep TableWriteStrategy x -> TableWriteStrategy # | |||||
Show TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods showsPrec :: Int -> TableWriteStrategy -> ShowS # show :: TableWriteStrategy -> String # showList :: [TableWriteStrategy] -> ShowS # | |||||
Eq TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite Methods (==) :: TableWriteStrategy -> TableWriteStrategy -> Bool # (/=) :: TableWriteStrategy -> TableWriteStrategy -> Bool # | |||||
type Rep TableWriteStrategy | |||||
Defined in Napkin.Run.Effects.Languages.SqlWrite type Rep TableWriteStrategy = D1 ('MetaData "TableWriteStrategy" "Napkin.Run.Effects.Languages.SqlWrite" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableWriteStrategyRecreate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TableWriteStrategyTruncate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TableWriteStrategyAppend" 'PrefixI 'False) (U1 :: Type -> Type))) |
type family BackendMaterializedViewMeta bk #
Instances
type BackendMaterializedViewMeta BigQuery | |
Defined in Napkin.Types.BigQuery | |
type BackendMaterializedViewMeta MsSql | |
Defined in Napkin.Types.MsSql | |
type BackendMaterializedViewMeta Postgres | |
Defined in Napkin.Types.Postgres | |
type BackendMaterializedViewMeta Redshift | |
Defined in Napkin.Types.Redshift | |
type BackendMaterializedViewMeta Sqlite | |
Defined in Napkin.Types.Sqlite |
type family BackendViewMeta bk #
Instances
type BackendViewMeta BigQuery | |
Defined in Napkin.Types.BigQuery | |
type BackendViewMeta MsSql | |
Defined in Napkin.Types.MsSql | |
type BackendViewMeta Postgres | |
Defined in Napkin.Types.Postgres | |
type BackendViewMeta Redshift | |
Defined in Napkin.Types.Redshift | |
type BackendViewMeta Sqlite | |
Defined in Napkin.Types.Sqlite |
type family BackendTableMeta bk #
Instances
type BackendTableMeta BigQuery | |
Defined in Napkin.Types.BigQuery | |
type BackendTableMeta MsSql | |
Defined in Napkin.Types.MsSql | |
type BackendTableMeta Postgres | |
Defined in Napkin.Types.Postgres | |
type BackendTableMeta Redshift | |
Defined in Napkin.Types.Redshift | |
type BackendTableMeta Sqlite | |
Defined in Napkin.Types.Sqlite |
type family BackendMeta (k :: TableKind) bk where ... #
Equations
BackendMeta 'KindTable bk = BackendTableMeta bk | |
BackendMeta 'KindView bk = BackendViewMeta bk | |
BackendMeta 'KindMaterializedView bk = BackendMaterializedViewMeta bk |
createTableAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> Query -> Sem r () #
createViewAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r () #
createMaterializedViewAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendMaterializedViewMeta b -> Ref Table -> Query -> Sem r () #
insertInto :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> InsertColumnsList -> Query -> Sem r () #
updateTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => UpdateQuery -> Sem r () #
copyTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> TableWriteStrategy -> Sem r () #
dropTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #
dropMaterializedView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #
deleteFrom :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> SExp -> Sem r () #
createTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> CreateTableDDL -> Sem r () #
dropColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r () #
addColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Type -> Sem r () #
createTableAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #
createTableIfNotExistAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #
createViewAs :: forall b (r :: EffectRow). (Default (BackendViewMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #
createMaterializedViewAs :: forall b (r :: EffectRow). (Default (BackendMaterializedViewMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #
insertIntoQuery :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Query -> Sem r () #
data LoadQuery (m :: k) a where #
Effects that deal with local files
Constructors
LoadQueryFromFile :: forall {k} (m :: k). FilePath -> SqlTemplateVariables -> LoadQuery m (Either LoadQueryError Text) | |
LoadQueryInline :: forall {k} (m :: k). SourceLocation -> Text -> SqlTemplateVariables -> LoadQuery m (Either LoadQueryError Text) |
Instances
CacheableEffect (LoadQuery :: k -> Type -> Type) LoadQueryCacheKey | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods | |
Eq (LoadQuery m a) | |
Ord (LoadQuery m a) | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods compare :: LoadQuery m a -> LoadQuery m a -> Ordering # (<) :: LoadQuery m a -> LoadQuery m a -> Bool # (<=) :: LoadQuery m a -> LoadQuery m a -> Bool # (>) :: LoadQuery m a -> LoadQuery m a -> Bool # (>=) :: LoadQuery m a -> LoadQuery m a -> Bool # |
newtype LoadQueryError #
Constructors
LoadQueryError Text |
Instances
Show LoadQueryError | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods showsPrec :: Int -> LoadQueryError -> ShowS # show :: LoadQueryError -> String # showList :: [LoadQueryError] -> ShowS # | |
Eq LoadQueryError | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods (==) :: LoadQueryError -> LoadQueryError -> Bool # (/=) :: LoadQueryError -> LoadQueryError -> Bool # |
data LoadQueryCacheKey #
Instances
CacheableEffect (LoadQuery :: k -> Type -> Type) LoadQueryCacheKey | |
Defined in Napkin.Run.Effects.Languages.LoadQuery Methods |
loadQueryFromFile :: forall (r :: EffectRow). Member (LoadQuery :: (Type -> Type) -> Type -> Type) r => FilePath -> SqlTemplateVariables -> Sem r (Either LoadQueryError Text) #
loadQueryInline :: forall (r :: EffectRow). Member (LoadQuery :: (Type -> Type) -> Type -> Type) r => SourceLocation -> Text -> SqlTemplateVariables -> Sem r (Either LoadQueryError Text) #
loadInline :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> Text -> SqlTemplateVariables -> Sem r a #
loadSqlFile :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Sem r Query #
loadSqlFiles :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => NonEmpty FilePath -> SqlTemplateVariables -> Sem r (NonEmpty Query) #
loadInlineSql :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Text -> SqlTemplateVariables -> Sem r Query #
loadInlineStatement :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => Text -> SqlTemplateVariables -> Sem r [a] #
loadStatementFile :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => FilePath -> SqlTemplateVariables -> Sem r [a] #
requiredArgDef :: ToJSON a => a -> SpecProgramArgumentDescription -> SpecProgramArgumentDefinition #
announceMetaArguments :: SpecProgramArguments -> b -> (SpecProgramArguments, b) #
noMetaArguments :: b -> (SpecProgramArguments, b) #
data BackendFunctionMeta #
Constructors
BackendFunctionMeta | |
Instances
Generic BackendFunctionMeta | |||||
Defined in Napkin.Untyped.Ops Associated Types
Methods from :: BackendFunctionMeta -> Rep BackendFunctionMeta x # to :: Rep BackendFunctionMeta x -> BackendFunctionMeta # | |||||
Show BackendFunctionMeta | |||||
Defined in Napkin.Untyped.Ops Methods showsPrec :: Int -> BackendFunctionMeta -> ShowS # show :: BackendFunctionMeta -> String # showList :: [BackendFunctionMeta] -> ShowS # | |||||
Eq BackendFunctionMeta | |||||
Defined in Napkin.Untyped.Ops Methods (==) :: BackendFunctionMeta -> BackendFunctionMeta -> Bool # (/=) :: BackendFunctionMeta -> BackendFunctionMeta -> Bool # | |||||
type Rep BackendFunctionMeta | |||||
Defined in Napkin.Untyped.Ops type Rep BackendFunctionMeta = D1 ('MetaData "BackendFunctionMeta" "Napkin.Untyped.Ops" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "BackendFunctionMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "aggs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Ref Function, SExp)]) :*: S1 ('MetaSel ('Just "analytics") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function]))) |
concatPortable :: [SExp] -> SExp #
"portable" concat for backends that do not have a native concat function.
simpleWindow :: Ref Function -> [SExp] -> WOver -> Maybe NullStrategy -> SExp #
asTimestamp :: SExp -> SExp #
nullifyUnless :: SExp -> SExp -> SExp #
Set to null unless predicate in first argument is true
nullifyIfEmpty :: SExp -> SExp #
Make empty string NULL.
deepApply :: (SExp -> SExp) -> SExp -> SExp #
Apply a function on Literals and Vars, recursing deep into function calls, etc.
inferAggGeneric :: BackendFunctionMeta -> SExp -> AggLevel #
Infer aggregation level of an expression.
TODO: ExternRaw and NativeExpr cant be inferred at the moment; needs more info inside the SExp if this becomes a problem.
unitBoundaryGeneric :: BackendFunctionMeta -> SExp -> [SExp] #
Explore expression's insides to pull out top level Unit
expressions within its branches, but no deeper in each branch.
Originally created to help with common expression caching - since you can commonolize unit-level expressions without any side-effect.
modifyUnitBoundaryGeneric :: BackendFunctionMeta -> (SExp -> SExp) -> SExp -> SExp #
Instances
class HasRefStore s where #
Instances
Supply of fresh reference names to be used in monadic contexts where you need an infinite-ish supply.
Instances
Data RefStore | |||||
Defined in Napkin.Untyped.Monad Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RefStore -> c RefStore # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RefStore # toConstr :: RefStore -> Constr # dataTypeOf :: RefStore -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RefStore) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RefStore) # gmapT :: (forall b. Data b => b -> b) -> RefStore -> RefStore # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RefStore -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RefStore -> r # gmapQ :: (forall d. Data d => d -> u) -> RefStore -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RefStore -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore # | |||||
Generic RefStore | |||||
Defined in Napkin.Untyped.Monad Associated Types
| |||||
Show RefStore | |||||
Eq RefStore | |||||
Ord RefStore | |||||
Defined in Napkin.Untyped.Monad | |||||
HasRefStore RefStore | |||||
type Rep RefStore | |||||
Defined in Napkin.Untyped.Monad type Rep RefStore = D1 ('MetaData "RefStore" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "RefStore" 'PrefixI 'True) (S1 ('MetaSel ('Just "feed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Text)) :*: S1 ('MetaSel ('Just "blacklist") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set Text)))) |
newRefStore :: RefStore #
newRef :: forall {k} s m (a :: k). (HasRefStore s, MonadState s m) => m (Ref a) #
withQ'_ :: Q a -> Q (Ref Relation, Query) #
Define a WITH subquery, returning the reference and the query.
withQ :: Q a -> Q (Ref Relation, Query, a) #
Define a WITH subquery, returning the reference, the query, and the result of running the Q
block.
withAs_ :: Selected Query -> Q (Ref Table) #
Define a WITH subquery while retaining and re-using its given name. Useful in some scenarios where you want to keep the original name in further referring to the newly introduced subquery table.
withAsUnique :: Selected Query -> Q (Ref Table) #
Use unique naming scheme along with Ref Relation to construct the WITH macro's name. This is useful when ensuring unique naming while not throwing out some human-readable information.
select_ :: SExp -> Q (Ref SExp) #
Smart selector that will use the variable's name if expression is a variable and assign a fresh variable name if it's something else without a name.
selectsGroupsAs_ :: [Selected SExp] -> Q () #
Select a field and also include it in GROUP BY. Do this intelligently, referring to it by its given name in most cases but by its direct expression definition in case of external functions to prevent overlap with fields that may already exist.
selectsGroupsAsRef_ :: [Selected SExp] -> Q () #
Like selectsGroupsAs_
but will use the name you gave to each
field in the group by statement. Some backends like BigQuery
require this while others like Redshift don't like it.
selectNonEmptyGroups :: [Selected SExp] -> Q () #
Special convenience case: Select and group while demanding that none of the group values is null.
fromIfNecessary :: Relation -> Q (Ref Relation) #
Add a from clause unless the relation is already in place.
fromRef_ :: Ref Relation -> Q (Ref Relation) #
Use a name directly and don't alias it one more time. | This can fail to create a proper alias if the Ref includes multiple names.
fromSpecified :: Q Bool #
Returns True iff the current Query already has an initial From table available.
fromOrJoin :: Alias Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation) #
joinSelected_ :: JoinType -> Selected Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation) #
joinAlias_ :: JoinType -> Alias Relation -> Either (Ref Relation -> Maybe SExp) [Ref SExp] -> Q (Ref Relation) #
having :: MonadState QState m => SExp -> m () #
tableOperator_ :: ParensOperator -> Q () #
tableOperatorL :: (Maybe ParensOperator -> Identity (Maybe ParensOperator)) -> QState -> Identity QState #
whereAdd :: MonadState QState m => SExp -> m () #
whereAddIn :: MonadState QState m => SExp -> [SExp] -> m () #
where x in y
whereAddNotIn :: MonadState QState m => SExp -> [SExp] -> m () #
where x not in y
limit_ :: MonadState QState m => Int -> m () #
offset_ :: MonadState QState m => Int -> m () #
scopeRelation :: SExp -> Relation -> Relation #
Make a query relation that applies predicate on the given relation in a subquery.
selectEverything :: [(Ref Relation, DefinedQuery)] -> Q () #
Introspects the given list of Query
ies, along with their
references in the current context, and selects every named field in
them within the current context, while deduplicating repeat fields
(by name). Good for the common case of joining tables and selecting
everything possible in them.
explicitSelectStar :: HasDefinition s => s -> Ref Relation -> Q () #
Instead of doing a select * that's impossible to introspect, explicitly select all fields from something that contains a definition - e.g. a Query.
explicitMapSelectStar :: HasDefinition s => s -> Ref Relation -> (Selected SExp -> Selected SExp) -> Q () #
Instead of doing a select * that's impossible to introspect, explicitly select all fields from something that contains a definition - e.g. a Query.
selectNonDuplicates :: Foldable t => t (Ref SExp) -> Q () #
Given a list of references, select those that have not yet been selected in current monadic block.
mapSelectNonDuplicates :: Foldable t => t (Ref SExp) -> (Selected SExp -> Selected SExp) -> Q () #
Given a list of references, select those that have not yet been selected in current monadic block with option to modify the finalized selection.
updateWhereAdd :: MonadState UState m => SExp -> m () #
updateSet_ :: Name -> SExp -> U () #
newtype TableMemos #
Constructors
TableMemos (Map SpecTableName TableMemo) |
Instances
Monoid TableMemos | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: TableMemos # mappend :: TableMemos -> TableMemos -> TableMemos # mconcat :: [TableMemos] -> TableMemos # | |
Semigroup TableMemos | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: TableMemos -> TableMemos -> TableMemos # sconcat :: NonEmpty TableMemos -> TableMemos # stimes :: Integral b => b -> TableMemos -> TableMemos # | |
ToDumpItem (b :: k) (Reader TableMemos) | |
Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types Methods toDumpItem :: forall (r :: EffectRow) x. Reader TableMemos (Sem r) x -> DumpItem b # |
newtype Transformed a #
Constructors
Transformed a |
Instances
Show a => Show (Transformed a) | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> Transformed a -> ShowS # show :: Transformed a -> String # showList :: [Transformed a] -> ShowS # | |
Eq a => Eq (Transformed a) | |
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: Transformed a -> Transformed a -> Bool # (/=) :: Transformed a -> Transformed a -> Bool # |
newtype MetaArguments #
Constructors
MetaArguments | |
Fields |
Instances
Monoid MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: MetaArguments # mappend :: MetaArguments -> MetaArguments -> MetaArguments # mconcat :: [MetaArguments] -> MetaArguments # | |||||
Semigroup MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: MetaArguments -> MetaArguments -> MetaArguments # sconcat :: NonEmpty MetaArguments -> MetaArguments # stimes :: Integral b => b -> MetaArguments -> MetaArguments # | |||||
IsList MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Associated Types
Methods fromList :: [Item MetaArguments] -> MetaArguments # fromListN :: Int -> [Item MetaArguments] -> MetaArguments # toList :: MetaArguments -> [Item MetaArguments] # | |||||
Show MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> MetaArguments -> ShowS # show :: MetaArguments -> String # showList :: [MetaArguments] -> ShowS # | |||||
Eq MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: MetaArguments -> MetaArguments -> Bool # (/=) :: MetaArguments -> MetaArguments -> Bool # | |||||
type Item MetaArguments | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec |
newtype TargetName #
Constructors
TargetName (Ref Table) |
newtype HiddenArtifacts #
Constructors
HiddenArtifacts (Set (Ref Table)) |
Instances
Default HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods def :: HiddenArtifacts # | |||||
Monoid HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mappend :: HiddenArtifacts -> HiddenArtifacts -> HiddenArtifacts # mconcat :: [HiddenArtifacts] -> HiddenArtifacts # | |||||
Semigroup HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: HiddenArtifacts -> HiddenArtifacts -> HiddenArtifacts # sconcat :: NonEmpty HiddenArtifacts -> HiddenArtifacts # stimes :: Integral b => b -> HiddenArtifacts -> HiddenArtifacts # | |||||
IsList HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Associated Types
Methods fromList :: [Item HiddenArtifacts] -> HiddenArtifacts # fromListN :: Int -> [Item HiddenArtifacts] -> HiddenArtifacts # toList :: HiddenArtifacts -> [Item HiddenArtifacts] # | |||||
Show HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> HiddenArtifacts -> ShowS # show :: HiddenArtifacts -> String # showList :: [HiddenArtifacts] -> ShowS # | |||||
Eq HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: HiddenArtifacts -> HiddenArtifacts -> Bool # (/=) :: HiddenArtifacts -> HiddenArtifacts -> Bool # | |||||
type Item HiddenArtifacts | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec |
newtype HiddenDependencies #
Constructors
HiddenDependencies (Set (Ref Table)) |
Instances
Default HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods | |||||
Monoid HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mempty :: HiddenDependencies # mappend :: HiddenDependencies -> HiddenDependencies -> HiddenDependencies # mconcat :: [HiddenDependencies] -> HiddenDependencies # | |||||
Semigroup HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: HiddenDependencies -> HiddenDependencies -> HiddenDependencies # sconcat :: NonEmpty HiddenDependencies -> HiddenDependencies # stimes :: Integral b => b -> HiddenDependencies -> HiddenDependencies # | |||||
IsList HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Associated Types
Methods fromList :: [Item HiddenDependencies] -> HiddenDependencies # fromListN :: Int -> [Item HiddenDependencies] -> HiddenDependencies # toList :: HiddenDependencies -> [Item HiddenDependencies] # | |||||
Show HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> HiddenDependencies -> ShowS # show :: HiddenDependencies -> String # showList :: [HiddenDependencies] -> ShowS # | |||||
Eq HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: HiddenDependencies -> HiddenDependencies -> Bool # (/=) :: HiddenDependencies -> HiddenDependencies -> Bool # | |||||
type Item HiddenDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec |
newtype ExtraDependencies #
Constructors
ExtraDependencies (Set (Ref Table)) |
Instances
Default ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods | |||||
Monoid ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods mappend :: ExtraDependencies -> ExtraDependencies -> ExtraDependencies # mconcat :: [ExtraDependencies] -> ExtraDependencies # | |||||
Semigroup ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (<>) :: ExtraDependencies -> ExtraDependencies -> ExtraDependencies # sconcat :: NonEmpty ExtraDependencies -> ExtraDependencies # stimes :: Integral b => b -> ExtraDependencies -> ExtraDependencies # | |||||
IsList ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Associated Types
Methods fromList :: [Item ExtraDependencies] -> ExtraDependencies # fromListN :: Int -> [Item ExtraDependencies] -> ExtraDependencies # toList :: ExtraDependencies -> [Item ExtraDependencies] # | |||||
Show ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods showsPrec :: Int -> ExtraDependencies -> ShowS # show :: ExtraDependencies -> String # showList :: [ExtraDependencies] -> ShowS # | |||||
Eq ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec Methods (==) :: ExtraDependencies -> ExtraDependencies -> Bool # (/=) :: ExtraDependencies -> ExtraDependencies -> Bool # | |||||
type Item ExtraDependencies | |||||
Defined in Napkin.Run.Effects.Languages.TableSpec |
renameReferences :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => (Ref Table -> Ref Table) -> Sem r a -> Sem r a #
Apply given table name renamer to every single reference occurrence everywhere.
If you want to target only certain tables, make sure the function you provide here does the filtering internally.
applyTransformer :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => QueryTransformerUnit -> Sem r a -> Sem r a #
Comprehensively apply the given transformer around the given region.
hideDependencies :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Set (Ref Table) -> Sem r a -> Sem r a #
Add the given dependencies to the hide list around the given region.
Later during interpretation, this will cause the given dependencies to not be considered upstream dependencies within the enclosed region.
hideDependency :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Ref Table -> Sem r a -> Sem r a #
Add the given dependency to the hide list around the given region.
Later during interpretation, this will cause the given dependency to not be considered upstream dependency within the enclosed region.
hideArtifact :: forall a (r :: EffectRow). Member (Reader HiddenArtifacts) r => Ref Table -> Sem r a -> Sem r a #
Add the given artifact to the hide list around the given region.
Later during interpretation, this will cause the given artifact to not be reported to the tablespec within the enclosed region.
addDependencies :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Set (Ref Table) -> Sem r () #
Add the given references to list of dependencies for the underlying region.
Later during interpretation, this will cause the given dependencies to be forcefully considered upstream dependencies within the enclosed region even though they were not seen in the parsed SQL.
overrideTarget :: forall a (r :: EffectRow). Member (Reader TargetName) r => Ref Table -> Sem r a -> Sem r a #
insertQueryIntoTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Query -> Sem effs () #
deleteFromTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => SExp -> Sem effs () #
updateTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => (Ref Relation -> U ()) -> Sem effs () #
memo :: forall a (eff :: EffectRow). (Member (Output TableMemo :: (Type -> Type) -> Type -> Type) eff, ToJSON a) => a -> Sem eff () #
data RecreateTable b (m :: k) a where #
Constructors
RecreateTableAs :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> NonEmpty Query -> RecreateTable b m () | |
RecreateViewAs :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> RecreateTable b m () | |
RecreateMaterializedViewAs :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> RecreateTable b m () | |
RecreateTableStatement' :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> CreateTableDDL -> [InsertStatement] -> RecreateTable b m () |
Instances
(Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => GShow (RecreateTable b a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.Recreate Methods gshowsPrec :: Int -> RecreateTable b a a0 -> ShowS # | |
(Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => Show (RecreateTable b a c) | |
Defined in Napkin.Run.Effects.Languages.Recreate Methods showsPrec :: Int -> RecreateTable b a c -> ShowS # show :: RecreateTable b a c -> String # showList :: [RecreateTable b a c] -> ShowS # |
recreateTableAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> NonEmpty Query -> Sem r () #
recreateViewAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r () #
recreateMaterializedViewAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendMaterializedViewMeta b -> Ref Table -> Query -> Sem r () #
recreateTableStatement' :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> CreateTableDDL -> [InsertStatement] -> Sem r () #
recreateTargetTable :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendTableMeta b -> NonEmpty Query -> Sem effs () #
recreateTableStatement :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendTableMeta b -> CreateTableDDL -> [InsertStatement] -> Sem effs () #
recreateTargetView :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendViewMeta b -> Query -> Sem effs () #
recreateTargetMaterializedView :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendMaterializedViewMeta b -> Query -> Sem effs () #
data AnnotateRead (b :: k) (m :: k1) a where #
Constructors
GetAnnotations :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> AnnotateRead b m TableAnnotations |
Instances
ToDumpItem (b :: k) (AnnotateRead b :: (Type -> Type) -> Type -> Type) | |
Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types Methods toDumpItem :: forall (r :: EffectRow) x. AnnotateRead b (Sem r) x -> DumpItem b # | |
GShow (AnnotateRead bk a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.AnnotateRead Methods gshowsPrec :: Int -> AnnotateRead bk a a0 -> ShowS # | |
Show (AnnotateRead bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateRead Methods showsPrec :: Int -> AnnotateRead bk a b -> ShowS # show :: AnnotateRead bk a b -> String # showList :: [AnnotateRead bk a b] -> ShowS # | |
Eq (AnnotateRead bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateRead Methods (==) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool # (/=) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool # |
data TableAnnotations #
Constructors
TableAnnotations | |
Fields |
Instances
Generic TableAnnotations | |||||
Defined in Napkin.Run.Effects.Languages.AnnotateRead Associated Types
Methods from :: TableAnnotations -> Rep TableAnnotations x # to :: Rep TableAnnotations x -> TableAnnotations # | |||||
type Rep TableAnnotations | |||||
Defined in Napkin.Run.Effects.Languages.AnnotateRead type Rep TableAnnotations = D1 ('MetaData "TableAnnotations" "Napkin.Run.Effects.Languages.AnnotateRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableAnnotations" 'PrefixI 'True) (S1 ('MetaSel ('Just "tableAnnotation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "columnsAnnotations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ColumnsAnnotations))) |
getTargetAnnotations :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateRead b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Sem effs TableAnnotations #
data AnnotateWrite (b :: k) (m :: k1) a where #
Constructors
AnnotateTable :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Text -> AnnotateWrite b m () | |
AnnotateColumns :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> ColumnsAnnotations -> AnnotateWrite b m () |
Instances
ToDumpItem (b :: k) (AnnotateWrite b :: (Type -> Type) -> Type -> Type) | |
Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types Methods toDumpItem :: forall (r :: EffectRow) x. AnnotateWrite b (Sem r) x -> DumpItem b # | |
GShow (AnnotateWrite bk a :: Type -> Type) | |
Defined in Napkin.Run.Effects.Languages.AnnotateWrite Methods gshowsPrec :: Int -> AnnotateWrite bk a a0 -> ShowS # | |
Show (AnnotateWrite bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateWrite Methods showsPrec :: Int -> AnnotateWrite bk a b -> ShowS # show :: AnnotateWrite bk a b -> String # showList :: [AnnotateWrite bk a b] -> ShowS # | |
Eq (AnnotateWrite bk a b) | |
Defined in Napkin.Run.Effects.Languages.AnnotateWrite Methods (==) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool # (/=) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool # |
data AnnotateDescription #
Constructors
TableDescription Text | |
ColumnDescription (Ref SExp) Text |
data AnnotateTableOrView #
Constructors
AnnotateTableOrView | |
Fields |
annotateTable :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r () #
annotateColumns :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> ColumnsAnnotations -> Sem r () #
annotateColumn :: forall {k} (b :: k) (effs :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) effs => Ref Table -> Ref SExp -> Text -> Sem effs () #
annotateTargetTable :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Text -> Sem effs () #
annotateTargetColumns :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => ColumnsAnnotations -> Sem effs () #
annotateTargetColumn :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Ref SExp -> Text -> Sem effs () #
askTextArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Text -> Sem r Text #
askTextArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Text #
askTextArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Text) #
askBoolArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Bool -> Text -> Sem r Bool #
askBoolArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Bool #
askBoolArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Bool) #
askNumArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Scientific -> Text -> Sem r Scientific #
askNumArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Scientific #
askNumArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Scientific) #
askArg :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r a #
askArgMb :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r (Maybe a) #
withTypedArg :: forall a b (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Typeable a) => (a -> Sem r b) -> Sem r b #
unpackRenderedSql :: RenderedSql -> Text #
Helper functions for napkin repl
sqlToFile :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> FilePath -> IO () #
Render to a local SQL file, mainly for debugging/devel help.
class HasBackendQueryStats b => LocalQueryStats (b :: k) (m :: Type -> Type) where #
Methods
tellStats :: QueryStats b -> m () #
Instances
HasBackendQueryStats b => LocalQueryStats (b :: k) IO | |
Defined in Napkin.Run.Base Methods tellStats :: QueryStats b -> IO () # | |
HasBackendQueryStats b => LocalQueryStats (b :: k) (KatipT IO) | |
Defined in Napkin.Run.Base Methods tellStats :: QueryStats b -> KatipT IO () # | |
HasBackendQueryStats backend => LocalQueryStats (backend :: k) (ReaderT (IORef (QueryStats backend)) (KatipT IO)) | |
Defined in Napkin.Run.Base Methods tellStats :: QueryStats backend -> ReaderT (IORef (QueryStats backend)) (KatipT IO) () # |
type MonadNapkin (b :: k) (m :: Type -> Type) = (Monad m, BackendDialect b, Katip m, MonadUnliftIO m, LocalQueryStats b m, RenderSql Query b) #
type ConnectionString = Text #
discardQueryStats :: Katip m => KatipT IO a -> m a #
newtype AuthSpecFile #
Constructors
AuthSpecFile | |
Fields |
Instances
Semigroup AuthSpecFile | |||||
Defined in Napkin.Spec.Types.Runtime Methods (<>) :: AuthSpecFile -> AuthSpecFile -> AuthSpecFile # sconcat :: NonEmpty AuthSpecFile -> AuthSpecFile # stimes :: Integral b => b -> AuthSpecFile -> AuthSpecFile # | |||||
Generic AuthSpecFile | |||||
Defined in Napkin.Spec.Types.Runtime Associated Types
| |||||
Show AuthSpecFile | |||||
Defined in Napkin.Spec.Types.Runtime Methods showsPrec :: Int -> AuthSpecFile -> ShowS # show :: AuthSpecFile -> String # showList :: [AuthSpecFile] -> ShowS # | |||||
Eq AuthSpecFile | |||||
Defined in Napkin.Spec.Types.Runtime | |||||
type Rep AuthSpecFile | |||||
Defined in Napkin.Spec.Types.Runtime type Rep AuthSpecFile = D1 ('MetaData "AuthSpecFile" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AuthSpecFile" 'PrefixI 'True) (S1 ('MetaSel ('Just "unAuthSpecFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath))) |
type SpecMetaArgs = Map Text Value #
newtype BkStatistics #
Constructors
BkStatistics Value |
Instances
FromJSON BkStatistics | |
Defined in Napkin.Spec.Types.Runtime | |
ToJSON BkStatistics | |
Defined in Napkin.Spec.Types.Runtime Methods toJSON :: BkStatistics -> Value # toEncoding :: BkStatistics -> Encoding # toJSONList :: [BkStatistics] -> Value # toEncodingList :: [BkStatistics] -> Encoding # omitField :: BkStatistics -> Bool # | |
Show BkStatistics | |
Defined in Napkin.Spec.Types.Runtime Methods showsPrec :: Int -> BkStatistics -> ShowS # show :: BkStatistics -> String # showList :: [BkStatistics] -> ShowS # | |
Eq BkStatistics | |
Defined in Napkin.Spec.Types.Runtime |
Instances
FromJSON AppName | |
Defined in Napkin.Spec.Types.Runtime | |
ToJSON AppName | |
Buildable AppName | |
Defined in Napkin.Spec.Types.Runtime | |
Semigroup AppName | |
Data AppName | |
Defined in Napkin.Spec.Types.Runtime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AppName -> c AppName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AppName # toConstr :: AppName -> Constr # dataTypeOf :: AppName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AppName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AppName) # gmapT :: (forall b. Data b => b -> b) -> AppName -> AppName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AppName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AppName -> r # gmapQ :: (forall d. Data d => d -> u) -> AppName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> AppName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AppName -> m AppName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AppName -> m AppName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AppName -> m AppName # | |
IsString AppName | |
Defined in Napkin.Spec.Types.Runtime Methods fromString :: String -> AppName # | |
Show AppName | |
Eq AppName | |
Ord AppName | |
Defined in Napkin.Spec.Types.Runtime |
data SpecDepsAndQueries (bk :: k) #
Constructors
SpecDepsAndQueries | |
Fields
|
Instances
Generic (SpecDepsAndQueries bk) | |||||
Defined in Napkin.Run.Effects.Types Associated Types
Methods from :: SpecDepsAndQueries bk -> Rep (SpecDepsAndQueries bk) x # to :: Rep (SpecDepsAndQueries bk) x -> SpecDepsAndQueries bk # | |||||
type Rep (SpecDepsAndQueries bk) | |||||
Defined in Napkin.Run.Effects.Types type Rep (SpecDepsAndQueries bk) = D1 ('MetaData "SpecDepsAndQueries" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecDepsAndQueries" 'PrefixI 'True) (S1 ('MetaSel ('Just "tablesDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SpecTableName, ProgramAndHooksDependenciesAndQueries bk)]) :*: S1 ('MetaSel ('Just "hooksDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, DryRunResult bk)]))) |
type ProgramAndHooksDependenciesAndQueries (bk :: k) = (ProgramDependenciesAndQueries bk, [DryRunResult bk], [DryRunResult bk]) #
data DryRunResult (b :: k) #
Constructors
DryRunResult | |
Fields
|
Instances
Monoid (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types Methods mempty :: DryRunResult b # mappend :: DryRunResult b -> DryRunResult b -> DryRunResult b # mconcat :: [DryRunResult b] -> DryRunResult b # | |||||
Semigroup (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types Methods (<>) :: DryRunResult b -> DryRunResult b -> DryRunResult b # sconcat :: NonEmpty (DryRunResult b) -> DryRunResult b # stimes :: Integral b0 => b0 -> DryRunResult b -> DryRunResult b # | |||||
Generic (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types Associated Types
Methods from :: DryRunResult b -> Rep (DryRunResult b) x # to :: Rep (DryRunResult b) x -> DryRunResult b # | |||||
Show (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types Methods showsPrec :: Int -> DryRunResult b -> ShowS # show :: DryRunResult b -> String # showList :: [DryRunResult b] -> ShowS # | |||||
Eq (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types Methods (==) :: DryRunResult b -> DryRunResult b -> Bool # (/=) :: DryRunResult b -> DryRunResult b -> Bool # | |||||
type Rep (DryRunResult b) | |||||
Defined in Napkin.Run.Effects.Types type Rep (DryRunResult b) = D1 ('MetaData "DryRunResult" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "DryRunResult" 'PrefixI 'True) ((S1 ('MetaSel ('Just "dependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dependencies) :*: S1 ('MetaSel ('Just "artifacts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Artifacts)) :*: (S1 ('MetaSel ('Just "queries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DumpItem b]) :*: (S1 ('MetaSel ('Just "loadedSqlQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Query)]) :*: S1 ('MetaSel ('Just "assertions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionLog))))) |
data ProgramDependenciesAndQueries (b :: k) #
Constructors
SinglePath (DryRunResult b) | |
MultiplePaths | |
Fields
|
class RunBackendEffect b where #
Minimal complete definition
runBackendEffectReal, runBackendEffectFake, interceptBackendEffectDiscoverDependencies, interceptBackendEffectApplyQueryTransformer
Methods
runBackendEffectReal :: forall (m :: Type -> Type) (r :: EffectRow) a. (LocalQueryStats b m, Members '[FatalError :: (Type -> Type) -> Type -> Type, Embed m] r, MonadNapkin b m, SqlIO m) => BackendConn b -> Sem (BackendSpecificEffect b ': r) a -> Sem r a #
runBackendEffectFake :: forall (r :: EffectRow) a. Members '[Reader HiddenDependencies, State IState :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Sem (BackendSpecificEffect b ': r) a -> Sem r a #
interceptBackendEffectDiscoverDependencies :: forall (r :: EffectRow) a. Members '[Input (Transformed HiddenDependencies) :: (Type -> Type) -> Type -> Type, Output Dependencies :: (Type -> Type) -> Type -> Type, BackendSpecificEffect b] r => Sem r a -> Sem r a #
interceptBackendEffectApplyQueryTransformer :: forall (r :: EffectRow) a. Members '[Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader QueryTransformer, BackendSpecificEffect b] r => Sem r a -> Sem r a #
backendDependencyValidator :: Proxy b -> [(SpecDependency -> Ref Table) -> SpecsDepsTables -> [WithSpecTable Text]] #
default backendDependencyValidator :: Proxy b -> [(SpecDependency -> Ref Table) -> SpecsDepsTables -> [WithSpecTable Text]] #
type Core b = '[FatalError :: (Type -> Type) -> Type -> Type, Input RandomToken :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Output LogLine :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, BackendSpecificEffect b, AnnotateRead b :: (Type -> Type) -> Type -> Type, AnnotateWrite b :: (Type -> Type) -> Type -> Type, LocalFile :: (Type -> Type) -> Type -> Type, Template :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, Reader QueryTransformer, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader HiddenArtifacts, Input MetaArguments :: (Type -> Type) -> Type -> Type, Reader SQLDialect, Reader ConnectionString, Fail :: (Type -> Type) -> Type -> Type] #
type TableEffects b = '[Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Output TableMemo :: (Type -> Type) -> Type -> Type] ++ Core b #
type AssertionEffects (b :: k1) = '[Assertion :: k -> Type -> Type] #
type IOGlobalHookProgramEffects b = '[Embed IO] ++ PureGlobalHookProgramEffects b #
type PureGlobalHookProgramEffects b = '[External :: (Type -> Type) -> Type -> Type, Reader TableMemos, Output TableMemo :: (Type -> Type) -> Type -> Type] ++ ((AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ Core b) #
type TableHookProgramEffects b = (AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ TableEffects b #
type SpecProgramEffects b = (AssertionEffects b :: [(Type -> Type) -> Type -> Type]) ++ TableEffects b #
newtype SpecProgramWithArgParser b #
Constructors
SpecProgramWithArgParser (Object -> Parser (SpecProgramArguments, SpecProgram b)) |
newtype HookProgramWithArgParser b #
Constructors
HookProgramWithArgParser (Object -> Parser (SpecProgramArguments, HookProgram b)) |
type SpecProgram b = SpecProgram' b () #
type PureGlobalHookProgram b = PureGlobalHookProgram' b () #
type PureGlobalHookProgram' b a = Sem (PureGlobalHookProgramEffects b) a #
type IOGlobalHookProgram b = IOGlobalHookProgram' b () #
type IOGlobalHookProgram' b a = Sem (IOGlobalHookProgramEffects b) a #
data HookSyncOrAsync #
Instances
Generic HookSyncOrAsync | |||||
Defined in Napkin.Run.Effects.Types Associated Types
Methods from :: HookSyncOrAsync -> Rep HookSyncOrAsync x # to :: Rep HookSyncOrAsync x -> HookSyncOrAsync # | |||||
Show HookSyncOrAsync | |||||
Defined in Napkin.Run.Effects.Types Methods showsPrec :: Int -> HookSyncOrAsync -> ShowS # show :: HookSyncOrAsync -> String # showList :: [HookSyncOrAsync] -> ShowS # | |||||
type Rep HookSyncOrAsync | |||||
Defined in Napkin.Run.Effects.Types |
type HookProgram b = HookProgram' b () #
Hooks have different capabilities than specs
type HookProgram' b a = Sem (TableHookProgramEffects b) a #
Programs packaged up for use in Specs. Intended for use in providing introspectable CustomCreate actions in specs.
type SpecProgram' b a = Sem (SpecProgramEffects b) a #
pattern SyncHook :: HookProgram b -> Hook b #
pattern AsyncHook :: HookProgram b -> Hook b #
parserlessHook :: HookProgram b -> HookProgramWithArgParser b #
parserlessSpec :: SpecProgram b -> SpecProgramWithArgParser b #
askRefRenamer :: forall (r :: EffectRow). Member (Reader QueryTransformer) r => Sem r (Ref Table -> Ref Table) #
askQueryRewriter :: forall (r :: EffectRow). Member (Reader QueryTransformer) r => Sem r (Query -> Query) #
askQueryRewriterData :: forall a (r :: EffectRow). (Data a, Member (Reader QueryTransformer) r) => Sem r (a -> a) #
summarizeWithHooks :: forall {k} (b :: k). ProgramAndHooksDependenciesAndQueries b -> DryRunResult b #
summarize :: forall {k} (b :: k). ProgramDependenciesAndQueries b -> DryRunResult b #
type SpecPreprocessorFunc bk = SpecMetaArgs -> Specs bk -> Specs bk #
type SpecPreprocessor b = Sem '[Input SpecPaths :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, State (Specs b) :: (Type -> Type) -> Type -> Type, Output DepsValidator :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Embed IO, Log :: (Type -> Type) -> Type -> Type] () #
type DepsValidator = (SpecDependency -> Ref Table) -> SpecsDepsTables -> [WithSpecTable Text] #
newtype SpecPreprocessorWithArgParser b #
Constructors
SpecPreprocessorWithArgParser (Object -> Parser (SpecProgramArguments, SpecPreprocessor b)) |
newtype CustomValidator #
CustomValidator
s are run before namespacing and return a list of errors in the incoming Spec.
TODO. I find this outmoded - it's a very restrictive form of doing custom validations. The new effect machinery is much richer in being able to introspect different types of database interactions under the SqlBackend type. Keeping this for legacy compatibility for now.
Constructors
CustomValidator | |
Fields
|
Instances
Default CustomValidator | |
Defined in Napkin.Spec.Types.Spec Methods def :: CustomValidator # |
Instances
MonadReader SpecPaths (Spec b) | |
MonadIO (Spec b) | |
Defined in Napkin.Spec.Types.Spec | |
MonadCatch (Spec b) | |
Defined in Napkin.Spec.Types.Spec | |
MonadMask (Spec b) | |
Defined in Napkin.Spec.Types.Spec Methods mask :: HasCallStack => ((forall a. Spec b a -> Spec b a) -> Spec b b0) -> Spec b b0 # uninterruptibleMask :: HasCallStack => ((forall a. Spec b a -> Spec b a) -> Spec b b0) -> Spec b b0 # generalBracket :: HasCallStack => Spec b a -> (a -> ExitCase b0 -> Spec b c) -> (a -> Spec b b0) -> Spec b (b0, c) # | |
MonadThrow (Spec b) | |
Defined in Napkin.Spec.Types.Spec Methods throwM :: (HasCallStack, Exception e) => e -> Spec b a # | |
Applicative (Spec b) | |
Functor (Spec b) | |
Monad (Spec b) | |
MonadState (Specs b) (Spec b) | |
type GlobalHooks b = Map Text ([SpecTableName], SpecGlobalHook b) #
data SpecGlobalHook b #
Constructors
PureSpecGlobalHook (PureGlobalHookProgram b) | |
IOSpecGlobalHook (IOGlobalHookProgram b) |
Instances
Generic b => Generic (SpecGlobalHook b) | |||||
Defined in Napkin.Spec.Types.Spec Associated Types
Methods from :: SpecGlobalHook b -> Rep (SpecGlobalHook b) x # to :: Rep (SpecGlobalHook b) x -> SpecGlobalHook b # | |||||
type Rep (SpecGlobalHook b) | |||||
Defined in Napkin.Spec.Types.Spec type Rep (SpecGlobalHook b) = D1 ('MetaData "SpecGlobalHook" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "PureSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PureGlobalHookProgram b))) :+: C1 ('MetaCons "IOSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IOGlobalHookProgram b)))) |
type SpecTableMap b = Map SpecTableName (TableSpec b) #
data UpdateStrategy #
Each strategy acts independently. For example, if you have only UpdateWithDependency, it wouldn't update even if the table were missing. You need to specify each strategy in the list.
Constructors
UpdateAlways | |
UpdatePeriodically NominalDiffTime | |
UpdateWithDependency | |
UpdateIfMissing | |
UpdateIfErroredLastRun |
Instances
Data UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateStrategy -> c UpdateStrategy # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateStrategy # toConstr :: UpdateStrategy -> Constr # dataTypeOf :: UpdateStrategy -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateStrategy) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateStrategy) # gmapT :: (forall b. Data b => b -> b) -> UpdateStrategy -> UpdateStrategy # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateStrategy -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateStrategy -> r # gmapQ :: (forall d. Data d => d -> u) -> UpdateStrategy -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateStrategy -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy # | |||||
Generic UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec Associated Types
Methods from :: UpdateStrategy -> Rep UpdateStrategy x # to :: Rep UpdateStrategy x -> UpdateStrategy # | |||||
Show UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec Methods showsPrec :: Int -> UpdateStrategy -> ShowS # show :: UpdateStrategy -> String # showList :: [UpdateStrategy] -> ShowS # | |||||
Eq UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec Methods (==) :: UpdateStrategy -> UpdateStrategy -> Bool # (/=) :: UpdateStrategy -> UpdateStrategy -> Bool # | |||||
Ord UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec Methods compare :: UpdateStrategy -> UpdateStrategy -> Ordering # (<) :: UpdateStrategy -> UpdateStrategy -> Bool # (<=) :: UpdateStrategy -> UpdateStrategy -> Bool # (>) :: UpdateStrategy -> UpdateStrategy -> Bool # (>=) :: UpdateStrategy -> UpdateStrategy -> Bool # max :: UpdateStrategy -> UpdateStrategy -> UpdateStrategy # min :: UpdateStrategy -> UpdateStrategy -> UpdateStrategy # | |||||
type Rep UpdateStrategy | |||||
Defined in Napkin.Spec.Types.Spec type Rep UpdateStrategy = D1 ('MetaData "UpdateStrategy" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) ((C1 ('MetaCons "UpdateAlways" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdatePeriodically" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NominalDiffTime))) :+: (C1 ('MetaCons "UpdateWithDependency" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UpdateIfMissing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdateIfErroredLastRun" 'PrefixI 'False) (U1 :: Type -> Type)))) |
type TableSpecTag = Text #
data SpecTarget b #
Constructors
SpecTable (BackendTableMeta b) | |
SpecView (BackendViewMeta b) | |
SpecMaterializedView (BackendMaterializedViewMeta b) |
toRef :: SpecDependency -> Ref Table #
allUnmanagedTasksInSpec :: SpecsDepsTables -> Set (WithSpecTable (Ref Table)) #
specAddPreHooks :: [HookProgram b] -> TableSpec b -> TableSpec b #
specAddPostHooks :: [HookProgram b] -> TableSpec b -> TableSpec b #
specAddAsyncPreHooks :: [HookProgram b] -> TableSpec b -> TableSpec b #
specAddAsyncPostHooks :: [HookProgram b] -> TableSpec b -> TableSpec b #
allSpecsTables :: Specs b -> Set SpecTableName #
All tables that are being created/managed as part of this spec.
defineTable :: TableSpec b -> Spec b () #
specTable :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> TableSpec b -> f (TableSpec b) #
specAction :: forall b f. Functor f => (SpecProgram b -> f (SpecProgram b)) -> TableSpec b -> f (TableSpec b) #
specUpdate :: forall b f. Functor f => ([UpdateStrategy] -> f [UpdateStrategy]) -> TableSpec b -> f (TableSpec b) #
specTags :: forall b f. Functor f => (Set TableSpecTag -> f (Set TableSpecTag)) -> TableSpec b -> f (TableSpec b) #
specsTables :: forall b f. Functor f => (SpecTableMap b -> f (SpecTableMap b)) -> Specs b -> f (Specs b) #
specsHooks :: forall b f. Functor f => (GlobalHooks b -> f (GlobalHooks b)) -> Specs b -> f (Specs b) #
specsMetaArgs :: forall b f. Functor f => (SpecMetaArgs -> f SpecMetaArgs) -> Specs b -> f (Specs b) #
specsTransformer :: forall b f. Functor f => (QueryTransformer -> f QueryTransformer) -> Specs b -> f (Specs b) #
specTagRefMap :: [TableSpec b] -> Map (Maybe TableSpecTag) [SpecTableName] #
create a mapping of TableSpecTag
s to `Ref Table`s for dumping.
specListTags :: forall bk m. MonadIO m => Specs bk -> m () #
Print the result of specTagRefMap'ing a particular spec to terminal.
scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays #
Scale by a factor. Note that scaleCalendarDiffDays (-1)
will not perfectly invert a duration, due to variable month lengths.
periodAllDays :: DayPeriod p => p -> [Day] #
A list of all the days in this period.
Since: time-1.12.1
periodFromDay :: DayPeriod p => Day -> (p, Int) #
Get the period this day is in, with the 1-based day number within the period.
periodFromDay (periodFirstDay p) = (p,1)
Since: time-1.12.1
periodLength :: DayPeriod p => p -> Int #
The number of days in this period.
Since: time-1.12.1
periodToDay :: DayPeriod p => p -> Int -> Day #
Inverse of periodFromDay
.
Since: time-1.12.1
periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day #
Validating inverse of periodFromDay
.
Since: time-1.12.1
pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day #
Bidirectional abstract constructor for the proleptic Gregorian calendar. Invalid values will be clipped to the correct range, month first, then day.
addGregorianDurationClip :: CalendarDiffDays -> Day -> Day #
Add months (clipped to last day), then add days
addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day #
Add months (rolling over to next month), then add days
addGregorianMonthsClip :: Integer -> Day -> Day #
Add months, with days past the last day of the month clipped to the last day. For instance, 2005-01-30 + 1 month = 2005-02-28.
addGregorianMonthsRollOver :: Integer -> Day -> Day #
Add months, with days past the last day of the month rolling over to the next month. For instance, 2005-01-30 + 1 month = 2005-03-02.
addGregorianYearsClip :: Integer -> Day -> Day #
Add years, matching month and day, with Feb 29th clipped to Feb 28th if necessary. For instance, 2004-02-29 + 2 years = 2006-02-28.
addGregorianYearsRollOver :: Integer -> Day -> Day #
Add years, matching month and day, with Feb 29th rolled over to Mar 1st if necessary. For instance, 2004-02-29 + 2 years = 2006-03-01.
diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays #
Calendrical difference, with as many whole months as possible
diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays #
Calendrical difference, with as many whole months as possible.
Same as diffGregorianDurationClip
for positive durations.
fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day #
Convert from proleptic Gregorian calendar. Invalid values will be clipped to the correct range, month first, then day.
fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day #
Convert from proleptic Gregorian calendar. Invalid values will return Nothing
gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth #
The number of days in a given month according to the proleptic Gregorian calendar.
showGregorian :: Day -> String #
Show in ISO 8601 format (yyyy-mm-dd)
toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth) #
Convert to proleptic Gregorian calendar.
pattern BeforeCommonEra :: Integer -> Year #
Also known as Before Christ.
Note that Year 1 = 1 CE, and the previous Year 0 = 1 BCE.
CommonEra
and BeforeCommonEra
form a COMPLETE
set.
dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int #
dayOfWeekDiff a b = a - b
in range 0 to 6.
The number of days from b to the next a.
firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day #
The first day-of-week on or after some day
weekAllDays :: DayOfWeek -> Day -> [Day] #
Returns a week containing the given Day
where the first day is the
DayOfWeek
specified.
Examples:
>>>
weekAllDays Sunday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 20 .. YearMonthDay 2022 2 26]
>>>
weekAllDays Monday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 21 .. YearMonthDay 2022 2 27]
>>>
weekAllDays Tuesday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 15 .. YearMonthDay 2022 2 21]
Since: time-1.12.2
weekFirstDay :: DayOfWeek -> Day -> Day #
Returns the first day of a week containing the given Day
.
Examples:
>>>
weekFirstDay Sunday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 20
>>>
weekFirstDay Monday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 21
>>>
weekFirstDay Tuesday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 15
Since: time-1.12.2
weekLastDay :: DayOfWeek -> Day -> Day #
Returns the last day of a week containing the given Day
.
Examples:
>>>
weekLastDay Sunday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 26
>>>
weekLastDay Monday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 27
>>>
weekLastDay Tuesday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 21
Since: time-1.12.2
diffTimeToPicoseconds :: DiffTime -> Integer #
Get the number of picoseconds in a DiffTime
.
picosecondsToDiffTime :: Integer -> DiffTime #
Create a DiffTime
from a number of picoseconds.
secondsToDiffTime :: Integer -> DiffTime #
Create a DiffTime
which represents an integral number of seconds.
nominalDay :: NominalDiffTime #
One day in NominalDiffTime
.
nominalDiffTimeToSeconds :: NominalDiffTime -> Pico #
Get the seconds in a NominalDiffTime
.
Since: time-1.9.1
secondsToNominalDiffTime :: Pico -> NominalDiffTime #
Create a NominalDiffTime
from a number of seconds.
Since: time-1.9.1
getTime_resolution :: DiffTime #
The resolution of getSystemTime
, getCurrentTime
, getPOSIXTime
.
On UNIX systems this uses clock_getres
, which may be wrong on WSL2.
addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime #
addUTCTime a b = a + b
diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime #
diffUTCTime a b = a - b
formatTime :: FormatTime t => TimeLocale -> String -> t -> String #
Substitute various time-related information for each %-code in the string, as per formatCharacter
.
The general form is %<modifier><width><alternate><specifier>
, where <modifier>
, <width>
, and <alternate>
are optional.
<modifier>
glibc-style modifiers can be used before the specifier (here marked as z
):
%-z
- no padding
%_z
- pad with spaces
%0z
- pad with zeros
%^z
- convert to upper case
%#z
- convert to lower case (consistently, unlike glibc)
<width>
Width digits can also be used after any modifiers and before the specifier (here marked as z
), for example:
%4z
- pad to 4 characters (with default padding character)
%_12z
- pad with spaces to 12 characters
<alternate>
An optional E
character indicates an alternate formatting. Currently this only affects %Z
and %z
.
%Ez
- alternate formatting
<specifier>
For all types (note these three are done by formatTime
, not by formatCharacter
):
%%
%
%t
- tab
%n
- newline
TimeZone
For TimeZone
(and ZonedTime
and UTCTime
):
%z
- timezone offset in the format
±HHMM
%Ez
- timezone offset in the format
±HH:MM
%Z
- timezone name (or else offset in the format
±HHMM
) %EZ
- timezone name (or else offset in the format
±HH:MM
)
LocalTime
For LocalTime
(and ZonedTime
and UTCTime
and UniversalTime
):
%c
- as
dateTimeFmt
locale
(e.g.%a %b %e %H:%M:%S %Z %Y
)
TimeOfDay
For TimeOfDay
(and LocalTime
and ZonedTime
and UTCTime
and UniversalTime
):
%R
- same as
%H:%M
%T
- same as
%H:%M:%S
%X
- as
timeFmt
locale
(e.g.%H:%M:%S
) %r
- as
time12Fmt
locale
(e.g.%I:%M:%S %p
) %P
- day-half of day from (
amPm
locale
), converted to lowercase,am
,pm
%p
- day-half of day from (
amPm
locale
),AM
,PM
%H
- hour of day (24-hour), 0-padded to two chars,
00
-23
%k
- hour of day (24-hour), space-padded to two chars,
0
-23
%I
- hour of day-half (12-hour), 0-padded to two chars,
01
-12
%l
- hour of day-half (12-hour), space-padded to two chars,
1
-12
%M
- minute of hour, 0-padded to two chars,
00
-59
%S
- second of minute (without decimal part), 0-padded to two chars,
00
-60
%q
- picosecond of second, 0-padded to twelve chars,
000000000000
-999999999999
. %Q
- decimal point and fraction of second, up to 12 second decimals, without trailing zeros.
For a whole number of seconds,
%Q
omits the decimal point unless padding is specified.
UTCTime
and ZonedTime
For UTCTime
and ZonedTime
:
%s
- number of whole seconds since the Unix epoch. For times before
the Unix epoch, this is a negative number. Note that in
%s.%q
and%s%Q
the decimals are positive, not negative. For example, 0.9 seconds before the Unix epoch is formatted as-1.1
with%s%Q
.
DayOfWeek
For DayOfWeek
(and Day
and LocalTime
and ZonedTime
and UTCTime
and UniversalTime
):
%u
- day of week number for Week Date format,
1
(= Monday) -7
(= Sunday) %w
- day of week number,
0
(= Sunday) -6
(= Saturday) %a
- day of week, short form (
snd
fromwDays
locale
),Sun
-Sat
%A
- day of week, long form (
fst
fromwDays
locale
),Sunday
-Saturday
Month
For Month
(and Day
and LocalTime
and ZonedTime
and UTCTime
and UniversalTime
):
%Y
- year, no padding. Note
%0Y
and%_Y
pad to four chars %y
- year of century, 0-padded to two chars,
00
-99
%C
- century, no padding. Note
%0C
and%_C
pad to two chars %B
- month name, long form (
fst
frommonths
locale
),January
-December
%b
,%h
- month name, short form (
snd
frommonths
locale
),Jan
-Dec
%m
- month of year, 0-padded to two chars,
01
-12
Day
For Day
(and LocalTime
and ZonedTime
and UTCTime
and UniversalTime
):
%D
- same as
%m/%d/%y
%F
- same as
%Y-%m-%d
%x
- as
dateFmt
locale
(e.g.%m/%d/%y
) %d
- day of month, 0-padded to two chars,
01
-31
%e
- day of month, space-padded to two chars,
1
-31
%j
- day of year, 0-padded to three chars,
001
-366
%f
- century for Week Date format, no padding. Note
%0f
and%_f
pad to two chars %V
- week of year for Week Date format, 0-padded to two chars,
01
-53
%U
- week of year where weeks start on Sunday (as
sundayStartWeek
), 0-padded to two chars,00
-53
%W
- week of year where weeks start on Monday (as
mondayStartWeek
), 0-padded to two chars,00
-53
Duration types
The specifiers for DiffTime
, NominalDiffTime
, CalendarDiffDays
, and CalendarDiffTime
are semantically
separate from the other types.
Specifiers on negative time differences will generally be negative (think rem
rather than mod
).
NominalDiffTime
and DiffTime
Note that a "minute" of DiffTime
is simply 60 SI seconds, rather than a minute of civil time.
Use NominalDiffTime
to work with civil time, ignoring any leap seconds.
For NominalDiffTime
and DiffTime
:
%w
- total whole weeks
%d
- total whole days
%D
- whole days of week
%h
- total whole hours
%H
- whole hours of day
%m
- total whole minutes
%M
- whole minutes of hour
%s
- total whole seconds
%Es
- total seconds, with decimal point and up to <width> (default 12) decimal places, without trailing zeros.
For a whole number of seconds,
%Es
omits the decimal point unless padding is specified. %0Es
- total seconds, with decimal point and <width> (default 12) decimal places.
%S
- whole seconds of minute
%ES
- seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros.
For a whole number of seconds,
%ES
omits the decimal point unless padding is specified. %0ES
- seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.
CalendarDiffDays
For CalendarDiffDays
(and CalendarDiffTime
):
%y
- total years
%b
- total months
%B
- months of year
%w
- total weeks, not including months
%d
- total days, not including months
%D
- days of week
CalendarDiffTime
For CalendarDiffTime
:
%h
- total hours, not including months
%H
- hours of day
%m
- total minutes, not including months
%M
- minutes of hour
%s
- total whole seconds, not including months
%Es
- total seconds, not including months, with decimal point and up to <width> (default 12) decimal places, without trailing zeros.
For a whole number of seconds,
%Es
omits the decimal point unless padding is specified. %0Es
- total seconds, not including months, with decimal point and <width> (default 12) decimal places.
%S
- whole seconds of minute
%ES
- seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros.
For a whole number of seconds,
%ES
omits the decimal point unless padding is specified. %0ES
- seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.
defaultTimeLocale :: TimeLocale #
Locale representing American usage.
knownTimeZones
contains only the ten time-zones mentioned in RFC 822 sec. 5:
"UT", "GMT", "EST", "EDT", "CST", "CDT", "MST", "MDT", "PST", "PDT".
Note that the parsing functions will regardless parse "UTC", single-letter military time-zones, and +HHMM format.
iso8601DateFormat :: Maybe String -> String #
Construct format string according to ISO-8601.
The Maybe String
argument allows to supply an optional time specification. E.g.:
iso8601DateFormat
Nothing == "%Y-%m-%d" -- i.e.YYYY-MM-DD
iso8601DateFormat
(Just "%H:%M:%S") == "%Y-%m-%dT%H:%M:%S" -- i.e.YYYY-MM-DDTHH:MM:SS
Format string according to RFC822.
Arguments
:: (MonadFail m, ParseTime t) | |
=> Bool | Accept leading and trailing whitespace? |
-> TimeLocale | Time locale. |
-> String | Format string. |
-> String | Input string. |
-> m t | Return the time value, or fail if the input could not be parsed using the given format. |
Parses a time value given a format string.
Missing information will be derived from 1970-01-01 00:00 UTC (which was a Thursday).
Supports the same %-codes as formatTime
, including %-
, %_
and %0
modifiers, however padding widths are not supported.
Case is not significant in the input string.
Some variations in the input are accepted:
%z
%Ez
- accepts any of
±HHMM
or±HH:MM
. %Z
%EZ
- accepts any string of letters, or any of the formats accepted by
%z
. %0Y
- accepts exactly four digits.
%0G
- accepts exactly four digits.
%0C
- accepts exactly two digits.
%0f
- accepts exactly two digits.
For example, to parse a date in YYYY-MM-DD format, while allowing the month
and date to have optional leading zeros (notice the -
modifier used for %m
and %d
):
Prelude Data.Time> parseTimeM True defaultTimeLocale "%Y-%-m-%-d" "2010-3-04" :: Maybe Day Just 2010-03-04
Arguments
:: (MonadFail m, ParseTime t) | |
=> Bool | Accept leading and trailing whitespace? |
-> TimeLocale | Time locale. |
-> [(String, String)] | Pairs of (format string, input string). |
-> m t | Return the time value, or fail if the input could not be parsed using the given format. |
Parses a time value given a list of pairs of format and input. Resulting value is constructed from all provided specifiers.
Arguments
:: ParseTime t | |
=> Bool | Accept leading and trailing whitespace? |
-> TimeLocale | Time locale. |
-> String | Format string. |
-> String | Input string. |
-> t | The time value. |
Parse a time value given a format string. Fails if the input could
not be parsed using the given format. See parseTimeM
for details.
Arguments
:: ParseTime t | |
=> Bool | Accept leading whitespace? |
-> TimeLocale | Time locale. |
-> String | Format string |
-> ReadP t |
Parse a time value given a format string. See parseTimeM
for details.
Arguments
:: ParseTime t | |
=> Bool | Accept leading whitespace? |
-> TimeLocale | Time locale. |
-> String | Format string |
-> ReadS t |
Parse a time value given a format string. See parseTimeM
for details.
scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime #
Scale by a factor. Note that scaleCalendarDiffTime (-1)
will not perfectly invert a duration, due to variable month lengths.
addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime #
addLocalTime a b = a + b
diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime #
diffLocalTime a b = a - b
localTimeToUT1 :: Rational -> LocalTime -> UniversalTime #
Get the UT1 time of a local time on a particular meridian (in degrees, positive is East).
localTimeToUTC :: TimeZone -> LocalTime -> UTCTime #
Get the UTC time of a local time in a time zone.
ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime #
Get the local time of a UT1 time on a particular meridian (in degrees, positive is East).
utcToLocalTime :: TimeZone -> UTCTime -> LocalTime #
Get the local time of a UTC time in a time zone.
dayFractionToTimeOfDay :: Rational -> TimeOfDay #
Get the time of day given the fraction of a day since midnight.
daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime #
Convert a count of days and a time of day since midnight into a period of time.
localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
Convert a time of day in some timezone to a time of day in UTC, together with a day adjustment.
pastMidnight :: DiffTime -> TimeOfDay #
Same as timeToTimeOfDay
.
sinceMidnight :: TimeOfDay -> DiffTime #
Same as timeOfDayToTime
.
timeOfDayToDayFraction :: TimeOfDay -> Rational #
Get the fraction of a day since midnight given a time of day.
timeOfDayToTime :: TimeOfDay -> DiffTime #
Get the time since midnight for a given time of day.
timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay) #
Convert a period of time into a count of days and a time of day since midnight. The time of day will never have a leap second.
timeToTimeOfDay :: DiffTime -> TimeOfDay #
Get the time of day given a time since midnight. Time more than 24h will be converted to leap-seconds.
utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
Convert a time of day in UTC to a time of day in some timezone, together with a day adjustment.
getCurrentTimeZone :: IO TimeZone #
Get the configured time-zone for the current time.
getTimeZone :: UTCTime -> IO TimeZone #
Get the configured time-zone for a given time (varying as per summertime adjustments).
On Unix systems the output of this function depends on:
- The value of
TZ
environment variable (if set) - The system time zone (usually configured by
/etc/localtime
symlink)
For details see tzset(3) and localtime(3).
Example:
> let t =UTCTime
(fromGregorian
2021 7 1) 0 >getTimeZone
t CEST >setEnv
"TZ" "America/New_York" >>getTimeZone
t EDT >setEnv
"TZ" "Europe/Berlin" >>getTimeZone
t CEST
On Windows systems the output of this function depends on:
- The value of
TZ
environment variable (if set). See here for how Windows interprets this variable. - The system time zone, configured in Settings
hoursToTimeZone :: Int -> TimeZone #
Create a nameless non-summer timezone for this number of hours.
minutesToTimeZone :: Int -> TimeZone #
Create a nameless non-summer timezone for this number of minutes.
timeZoneOffsetString :: TimeZone -> String #
Text representing the offset of this timezone, such as "-0800" or "+0400" (like %z
in formatTime).
timeZoneOffsetString' :: Maybe Char -> TimeZone -> String #
Text representing the offset of this timezone, such as "-0800" or "+0400" (like %z
in formatTime), with arbitrary padding.
getZonedTime :: IO ZonedTime #
utcToLocalZonedTime :: UTCTime -> IO ZonedTime #
utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime #
zonedTimeToUTC :: ZonedTime -> UTCTime #
data CalendarDiffDays #
Constructors
CalendarDiffDays | |
Instances
FromJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser CalendarDiffDays # parseJSONList :: Value -> Parser [CalendarDiffDays] # | |
ToJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: CalendarDiffDays -> Value # toEncoding :: CalendarDiffDays -> Encoding # toJSONList :: [CalendarDiffDays] -> Value # toEncodingList :: [CalendarDiffDays] -> Encoding # omitField :: CalendarDiffDays -> Bool # | |
NFData CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods rnf :: CalendarDiffDays -> () # | |
Monoid CalendarDiffDays | Additive |
Defined in Data.Time.Calendar.CalendarDiffDays Methods mappend :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays # mconcat :: [CalendarDiffDays] -> CalendarDiffDays # | |
Semigroup CalendarDiffDays | Additive |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (<>) :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays # sconcat :: NonEmpty CalendarDiffDays -> CalendarDiffDays # stimes :: Integral b => b -> CalendarDiffDays -> CalendarDiffDays # | |
Data CalendarDiffDays | Since: time-1.9.2 |
Defined in Data.Time.Calendar.CalendarDiffDays Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays # toConstr :: CalendarDiffDays -> Constr # dataTypeOf :: CalendarDiffDays -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) # gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r # gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # | |
Show CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods showsPrec :: Int -> CalendarDiffDays -> ShowS # show :: CalendarDiffDays -> String # showList :: [CalendarDiffDays] -> ShowS # | |
Eq CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (==) :: CalendarDiffDays -> CalendarDiffDays -> Bool # (/=) :: CalendarDiffDays -> CalendarDiffDays -> Bool # | |
ISO8601 CalendarDiffDays |
|
Defined in Data.Time.Format.ISO8601 Methods |
class Ord p => DayPeriod p where #
The class of types which can be represented as a period of days.
Since: time-1.12.1
Methods
periodFirstDay :: p -> Day #
Returns the first Day
in a period of days.
periodLastDay :: p -> Day #
Returns the last Day
in a period of days.
Get the period this day is in.
Instances
DayPeriod Day | |
Defined in Data.Time.Calendar.Days | |
DayPeriod Month | |
Defined in Data.Time.Calendar.Month | |
DayPeriod Quarter | |
Defined in Data.Time.Calendar.Quarter |
type DayOfMonth = Int #
Day of month, in range 1 to 31.
type MonthOfYear = Int #
Month of year, in range 1 (January) to 12 (December).
newtype UniversalTime #
The Modified Julian Date is the day with the fraction of the day, measured from UT midnight. It's used to represent UT1, which is time as measured by the earth's rotation, adjusted for various wobbles.
Constructors
ModJulianDate | |
Fields |
Instances
NFData UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods rnf :: UniversalTime -> () # | |
Buildable UniversalTime | |
Defined in Formatting.Buildable Methods build :: UniversalTime -> Builder # | |
Data UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime # toConstr :: UniversalTime -> Constr # dataTypeOf :: UniversalTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) # gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r # gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # | |
Eq UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods (==) :: UniversalTime -> UniversalTime -> Bool # (/=) :: UniversalTime -> UniversalTime -> Bool # | |
Ord UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods compare :: UniversalTime -> UniversalTime -> Ordering # (<) :: UniversalTime -> UniversalTime -> Bool # (<=) :: UniversalTime -> UniversalTime -> Bool # (>) :: UniversalTime -> UniversalTime -> Bool # (>=) :: UniversalTime -> UniversalTime -> Bool # max :: UniversalTime -> UniversalTime -> UniversalTime # min :: UniversalTime -> UniversalTime -> UniversalTime # |
class FormatTime t #
Minimal complete definition
Instances
FormatTime DotNetTime | |
Defined in Data.Aeson.Types.Internal Methods formatCharacter :: Bool -> Char -> Maybe (FormatOptions -> DotNetTime -> String) # |
The class of types which can be parsed given a UNIX-style time format string.
Minimal complete definition
data CalendarDiffTime #
Constructors
CalendarDiffTime | |
Fields
|
Instances
FromJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser CalendarDiffTime # parseJSONList :: Value -> Parser [CalendarDiffTime] # | |
ToJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: CalendarDiffTime -> Value # toEncoding :: CalendarDiffTime -> Encoding # toJSONList :: [CalendarDiffTime] -> Value # toEncodingList :: [CalendarDiffTime] -> Encoding # omitField :: CalendarDiffTime -> Bool # | |
NFData CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods rnf :: CalendarDiffTime -> () # | |
Monoid CalendarDiffTime | Additive |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods mappend :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime # mconcat :: [CalendarDiffTime] -> CalendarDiffTime # | |
Semigroup CalendarDiffTime | Additive |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (<>) :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime # sconcat :: NonEmpty CalendarDiffTime -> CalendarDiffTime # stimes :: Integral b => b -> CalendarDiffTime -> CalendarDiffTime # | |
Data CalendarDiffTime | Since: time-1.9.2 |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime # toConstr :: CalendarDiffTime -> Constr # dataTypeOf :: CalendarDiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) # gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # | |
Show CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods showsPrec :: Int -> CalendarDiffTime -> ShowS # show :: CalendarDiffTime -> String # showList :: [CalendarDiffTime] -> ShowS # | |
Eq CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (==) :: CalendarDiffTime -> CalendarDiffTime -> Bool # (/=) :: CalendarDiffTime -> CalendarDiffTime -> Bool # | |
ISO8601 CalendarDiffTime |
|
Defined in Data.Time.Format.ISO8601 Methods |
A TimeZone is a whole number of minutes offset from UTC, together with a name and a "just for summer" flag.
Constructors
TimeZone | |
Fields
|
Instances
NFData TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
Buildable TimeZone | |
Defined in Formatting.Buildable | |
Data TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone # toConstr :: TimeZone -> Constr # dataTypeOf :: TimeZone -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) # gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r # gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # | |
Show TimeZone | This only shows the time zone name, or offset if the name is empty. |
Eq TimeZone | |
Ord TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
ISO8601 TimeZone |
|
Defined in Data.Time.Format.ISO8601 Methods |
A local time together with a time zone.
There is no Eq
instance for ZonedTime
.
If you want to compare local times, use zonedTimeToLocalTime
.
If you want to compare absolute times, use zonedTimeToUTC
.
Constructors
ZonedTime | |
Fields |
Instances
FromJSON ZonedTime | Supported string formats:
The first space may instead be a |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey ZonedTime | |
Defined in Data.Aeson.Types.FromJSON Methods | |
ToJSON ZonedTime | |
ToJSONKey ZonedTime | |
Defined in Data.Aeson.Types.ToJSON | |
NFData ZonedTime | |
Defined in Data.Time.LocalTime.Internal.ZonedTime | |
Buildable ZonedTime | |
Defined in Formatting.Buildable | |
Data ZonedTime | |
Defined in Data.Time.LocalTime.Internal.ZonedTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime # toConstr :: ZonedTime -> Constr # dataTypeOf :: ZonedTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) # gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r # gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # | |
Show ZonedTime | For the time zone, this only shows the name, or offset if the name is empty. |
FromFormKey ZonedTime | |
Defined in Web.Internal.FormUrlEncoded | |
ToFormKey ZonedTime | |
Defined in Web.Internal.FormUrlEncoded | |
ISO8601 ZonedTime |
|
Defined in Data.Time.Format.ISO8601 Methods |
assertNotNull :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [SExp] -> Sem r () #
Fail if any of the given expressions/columns have any NULL values.
data CountTolerance #
Constructors
Absolute Scientific | |
Relative Scientific |
Instances
Show CountTolerance # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods showsPrec :: Int -> CountTolerance -> ShowS # show :: CountTolerance -> String # showList :: [CountTolerance] -> ShowS # | |
Eq CountTolerance # | |
Defined in Napkin.Run.Effects.Hooks.Types Methods (==) :: CountTolerance -> CountTolerance -> Bool # (/=) :: CountTolerance -> CountTolerance -> Bool # |
Constructors
FromToRange a a | |
ValuesList [a] |
Instances
Generic (WithinSet a) # | |||||
Defined in Napkin.Run.Effects.Hooks.Types Associated Types
| |||||
Show a => Show (WithinSet a) # | |||||
Eq a => Eq (WithinSet a) # | |||||
type Rep (WithinSet a) # | |||||
Defined in Napkin.Run.Effects.Hooks.Types type Rep (WithinSet a) = D1 ('MetaData "WithinSet" "Napkin.Run.Effects.Hooks.Types" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "FromToRange" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "ValuesList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a]))) |
pattern ApproxEqualRelative :: Scientific -> CompareCount #
pattern ApproxEqualAbsolute :: Scientific -> CompareCount #
assertAllValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #
Fail if the table column contains some values beyond the specified (inclusive) range.
assertAllValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #
Fail if the target column contains some values beyond the specified (inclusive) range.
assertAnswerConst :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> a -> Sem r () #
Compares result of a query against a constant value using comparison over Real numbers, fails if check does not hold.
assertAnswerConstT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Real a, Show a, Val a) => CompareCount -> Q q -> a -> Sem r () #
Compares result of a query against a constant value using comparison over Real numbers, fails if check does not hold.
assertAnswerEq :: forall {k} a (b :: k) (r :: EffectRow). (Eq a, GlobalAssert b r, Show a, Val a) => Query -> a -> Sem r () #
Compares result of a query against a constant value using comparison over Eq constraint, fails if check does not hold.
assertAnswerEqT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Eq a, Show a, Val a) => Q q -> a -> Sem r () #
Compares result of a query against a constant value using comparison over Eq constraint, fails if check does not hold.
assertAnswers :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> Query -> Sem r () #
Compares result of a two queries, fails if check does not hold.
assertAnyPresent :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => SExp -> Relation -> Sem r () #
Checks if any values are present in given column.
assertAnyPresentT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r () #
Checks if any values are present in given column.
assertAnyValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #
Fail if the table column contains no values from the specified (inclusive) range.
assertAnyValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #
Fail if the target column contains no values from the specified (inclusive) range.
assertCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> Relation -> SExp -> Sem r () #
Checks the cardinalities of two columns that may be sourced from different tables.
assertCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> Relation -> SExp -> Sem r () #
Checks the cardinalities of two columns that may be sourced from different tables.
assertCount :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Relation -> Sem r () #
Compares counts of two relations, fails if check does not hold.
assertCountConst :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Integer -> Sem r () #
Compares counts of relation against a constant value, fails if check does not hold.
assertCountConstT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Integer -> Sem r () #
Compares counts of target against a constant value, fails if check does not hold.
assertCountT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Relation -> Sem r () #
Compares counts of target and a relation, fails if check does not hold.
assertExpression :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> SExp -> Sem r () #
Assert expression is true
assertExpressionT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r () #
Assert expression is true
assertNotNullT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [SExp] -> Sem r () #
Fail if any of the given expressions/columns have any NULL values.
assertNoValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #
Fail if the table column contains some values within the specified (inclusive) range.
assertNoValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #
Fail if the target column contains some values within the specified (inclusive) range.
assertUniqueBy :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [Selected SExp] -> Sem r () #
Fail if there are non-unique rows in the result.
assertUniqueByCap :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CountTolerance -> Relation -> [Selected SExp] -> Sem r () #
Checks if number of duplicate rows in a table is within certain tolerance.
assertUniqueByCapT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CountTolerance -> [Selected SExp] -> Sem r () #
Checks if number of duplicate rows in a target is within certain tolerance.
assertUniqueByT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [Selected SExp] -> Sem r () #
Fail if there are non-unique rows in the result.
assertUniqueByWhere :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> PredicateSExp -> [Selected SExp] -> Sem r () #
Fail if there are non-unique rows in the result for the multiple predicate and column names.
assertUniqueByWhereT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => PredicateSExp -> [Selected SExp] -> Sem r () #
Fail if there are non-unique rows in the result for the multiple predicate and column names.
assertMultipleCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> [(Relation, SExp)] -> Sem r () #
Checks the cardinalities of multiple columns that may be sourced from many different tables.
assertMultipleCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> [(Relation, SExp)] -> Sem r () #
Checks the cardinalities of multiple columns that may be sourced from many different tables.
assertMultipleColumnsCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> [Selected SExp] -> Relation -> [Selected SExp] -> Sem r () #
Checks the cardinalities of two columns that may be sourced from different tables.
splitIfUnionBy :: forall b (r :: EffectRow) a. Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, RecreateTable b :: (Type -> Type) -> Type -> Type] r => Int -> Sem r a -> Sem r a #
Intercept CreateTableAs calls and try to split queries into CreateTableAs + multiple InsertInto when query contains unions
Arguments
:: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, RecreateTable b :: (Type -> Type) -> Type -> Type] r | |
=> (Day -> Sem r Query) | Query with cutoff |
-> SExp | Primary key column |
-> Day | Starting timestamp value in fresh create |
-> Integer | Num days to look back in each update |
-> BackendTableMeta b | |
-> Sem r () |
Arguments
:: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) | |
=> FilePath | Local SQL file |
-> SqlTemplateVariables | Any additional variables you want to bind |
-> [ColumnName] | Names of columns to keep on schema change |
-> SExp | Timestamp column in the destination table |
-> Day | Start time when creating table fresh |
-> Integer | N days to go back |
-> BackendTableMeta b | |
-> Sem r () |
incrementalByTimeCreateAction #
Arguments
:: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader TargetName, Input MetaArguments :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) | |
=> [ColumnName] | Names of columns to keep on schema change |
-> (Day -> Sem r Query) | Table query |
-> Day | Start time when creating table fresh |
-> (Day -> SExp) | Cutoff SExp |
-> Integer | N days to go back |
-> BackendTableMeta b | |
-> Sem r () |
loadSqlFileWithCutoff :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Day -> Sem r Query #
copyData :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => CopySource -> CopyDestination -> Sem r () #
copyData' :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => InsertColumnsList -> CopySource -> CopyDestination -> Sem r () #
Arguments
:: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type] r | |
=> Ref Table | the long table from which this table will be derived- make sure it is also listed in the dependencies |
-> (SExp -> SExp) | Aggregate function to use |
-> [Alias SExp] | the key columns which will remain in the resultant wide version as-is |
-> SExp | the column name in the long table which will be split into multiple columns in the wide version |
-> SExp | the column in the long table which will be emitted from matching on the new columns |
-> (Value -> Ref SExp) | a function to generate column names from the values found in the database |
-> SpecTarget b | standard table options |
-> Sem r () |
Arguments
:: forall b (r :: EffectRow). (HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader QueryTransformer] r) | |
=> SpecTarget b | |
-> (Query -> Query) | Any final optional query modification |
-> [Relation] | List of sources to combine |
-> Sem r () |
createRawSql :: forall b (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader QueryTransformer, RecreateTable b :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> ExtraDependencies -> HiddenDependencies -> SpecTarget b -> Sem r () #
createWithQuery :: forall b (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader QueryTransformer, RecreateTable b :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type] r => NonEmpty Query -> SpecTarget b -> ExtraDependencies -> HiddenDependencies -> Sem r () #
recreateTarget :: forall b (r :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName, SqlWrite b :: (Type -> Type) -> Type -> Type] r => SpecTarget b -> NonEmpty Query -> Sem r () #
pattern IncrementalReset :: (Eq a, IsString a) => a #
enforceSchema :: forall b (r :: EffectRow). (Eq (BackendSchemaField b), HasBackendSchemaField b, Members '[Input TemporaryTableName :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => SchemaMigrationOptions -> Ref Table -> [BackendSchemaField b] -> Sem r () #
data SchemaMigrationOptions #
Constructors
SchemaMigrationOptions | |
Instances
Generic SchemaMigrationOptions # | |||||
Defined in Napkin.Run.Effects.Programs Associated Types
Methods from :: SchemaMigrationOptions -> Rep SchemaMigrationOptions x # to :: Rep SchemaMigrationOptions x -> SchemaMigrationOptions # | |||||
Show SchemaMigrationOptions # | |||||
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> SchemaMigrationOptions -> ShowS # show :: SchemaMigrationOptions -> String # showList :: [SchemaMigrationOptions] -> ShowS # | |||||
Eq SchemaMigrationOptions # | |||||
Defined in Napkin.Run.Effects.Programs Methods (==) :: SchemaMigrationOptions -> SchemaMigrationOptions -> Bool # (/=) :: SchemaMigrationOptions -> SchemaMigrationOptions -> Bool # | |||||
type Rep SchemaMigrationOptions # | |||||
Defined in Napkin.Run.Effects.Programs type Rep SchemaMigrationOptions = D1 ('MetaData "SchemaMigrationOptions" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "SchemaMigrationOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "dropColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy DroppedColumnPolicy)) :*: S1 ('MetaSel ('Just "addColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy AddedColumnPolicy)))) |
askSchemaMigrationOptions :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Ref Table -> Sem r SchemaMigrationOptions #
data AddedColumnPolicy #
Constructors
ForbidAdding | |
AllowAdding |
Instances
Bounded AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs | |||||
Enum AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods succ :: AddedColumnPolicy -> AddedColumnPolicy # pred :: AddedColumnPolicy -> AddedColumnPolicy # toEnum :: Int -> AddedColumnPolicy # fromEnum :: AddedColumnPolicy -> Int # enumFrom :: AddedColumnPolicy -> [AddedColumnPolicy] # enumFromThen :: AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # enumFromTo :: AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # enumFromThenTo :: AddedColumnPolicy -> AddedColumnPolicy -> AddedColumnPolicy -> [AddedColumnPolicy] # | |||||
Generic AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Associated Types
Methods from :: AddedColumnPolicy -> Rep AddedColumnPolicy x # to :: Rep AddedColumnPolicy x -> AddedColumnPolicy # | |||||
Show AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> AddedColumnPolicy -> ShowS # show :: AddedColumnPolicy -> String # showList :: [AddedColumnPolicy] -> ShowS # | |||||
Eq AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods (==) :: AddedColumnPolicy -> AddedColumnPolicy -> Bool # (/=) :: AddedColumnPolicy -> AddedColumnPolicy -> Bool # | |||||
type Rep AddedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs |
data DroppedColumnPolicy #
Constructors
ForbidDropping | |
KeepDropped | |
AllowDropping |
Instances
Bounded DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs | |||||
Enum DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods succ :: DroppedColumnPolicy -> DroppedColumnPolicy # pred :: DroppedColumnPolicy -> DroppedColumnPolicy # toEnum :: Int -> DroppedColumnPolicy # fromEnum :: DroppedColumnPolicy -> Int # enumFrom :: DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromThen :: DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromTo :: DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # enumFromThenTo :: DroppedColumnPolicy -> DroppedColumnPolicy -> DroppedColumnPolicy -> [DroppedColumnPolicy] # | |||||
Generic DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Associated Types
Methods from :: DroppedColumnPolicy -> Rep DroppedColumnPolicy x # to :: Rep DroppedColumnPolicy x -> DroppedColumnPolicy # | |||||
Show DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> DroppedColumnPolicy -> ShowS # show :: DroppedColumnPolicy -> String # showList :: [DroppedColumnPolicy] -> ShowS # | |||||
Eq DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs Methods (==) :: DroppedColumnPolicy -> DroppedColumnPolicy -> Bool # (/=) :: DroppedColumnPolicy -> DroppedColumnPolicy -> Bool # | |||||
type Rep DroppedColumnPolicy # | |||||
Defined in Napkin.Run.Effects.Programs type Rep DroppedColumnPolicy = D1 ('MetaData "DroppedColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ForbidDropping" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KeepDropped" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowDropping" 'PrefixI 'False) (U1 :: Type -> Type))) |
mkDefaultPolicy :: a -> ColumnPolicy a #
data ColumnPolicy a #
Constructors
ColumnPolicy | |
Fields
|
Instances
Generic (ColumnPolicy a) # | |||||
Defined in Napkin.Run.Effects.Programs Associated Types
Methods from :: ColumnPolicy a -> Rep (ColumnPolicy a) x # to :: Rep (ColumnPolicy a) x -> ColumnPolicy a # | |||||
Show a => Show (ColumnPolicy a) # | |||||
Defined in Napkin.Run.Effects.Programs Methods showsPrec :: Int -> ColumnPolicy a -> ShowS # show :: ColumnPolicy a -> String # showList :: [ColumnPolicy a] -> ShowS # | |||||
Eq a => Eq (ColumnPolicy a) # | |||||
Defined in Napkin.Run.Effects.Programs Methods (==) :: ColumnPolicy a -> ColumnPolicy a -> Bool # (/=) :: ColumnPolicy a -> ColumnPolicy a -> Bool # | |||||
type Rep (ColumnPolicy a) # | |||||
Defined in Napkin.Run.Effects.Programs type Rep (ColumnPolicy a) = D1 ('MetaData "ColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ColumnPolicy" 'PrefixI 'True) (S1 ('MetaSel ('Just "defaultPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "columnOverrides") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text a)))) |
pattern AddColumnsList :: (Eq a, IsString a) => a #
pattern AddColumnsPolicy :: (Eq a, IsString a) => a #
pattern DropColumnsList :: (Eq a, IsString a) => a #
pattern DropColumnsPolicy :: (Eq a, IsString a) => a #
spec :: SpecTableName -> TableSpec b #
shorthand for starting specs, use lenses to then update parts
ctaMeta :: forall b f. Functor f => (BackendTableMeta b -> f (BackendTableMeta b)) -> CreateTableAs b -> f (CreateTableAs b) #
ctaName :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> CreateTableAs b -> f (CreateTableAs b) #
ctaQuery :: forall b f. Functor f => (Query -> f Query) -> CreateTableAs b -> f (CreateTableAs b) #
ctaToSpec :: CreateTableAs b -> TableSpec b #
tableWithQueryAndMeta :: BackendTableMeta b -> SpecTableName -> Query -> TableSpec b #
tableWithQuery :: Default (BackendTableMeta b) => SpecTableName -> Query -> TableSpec b #
programToSpec :: SpecTableName -> SpecProgram b -> TableSpec b #
viewWithQuery :: Default (BackendViewMeta b) => SpecTableName -> Query -> TableSpec b #
specSplitIfUnion :: TableSpec b0 -> TableSpec b0 #
Split UNION queries and insert each individually.
specSplitIfUnionBy :: Int -> TableSpec b0 -> TableSpec b0 #
Split a top level UNION based query table definition into individual insert-based queries in chunks of n.
Arguments
:: (Default (BackendTableMeta b), HasBackendSchemaField b) | |
=> [Text] | Columns to keep on schema change |
-> (Day -> CreateTableAs b) | How to create/form the target table with data newer than the given cutoff date |
-> (Day -> SExp) | Filter in (DELETE WHERE) to be used when deleting data newer than the given cutoff date in the target table. |
-> Day | Overall start date to use when starting fresh |
-> Integer | Number of days to go back and refresh each time update is run |
-> [Ref Table] | Custom additional dependencies to be included (legacy) |
-> TableSpec b |
Arguments
:: (Default (BackendTableMeta b), HasBackendSchemaField b) | |
=> SpecTableName | Name of the backend, required for sql rendering |
-> BackendTableMeta b | Any backend specific table options |
-> [Ref Table] | Table's dependencies |
-> FilePath | Local SQL file |
-> SqlTemplateVariables | Any additional variables you want to bind |
-> [Text] | Columns to keep on schema change |
-> SExp | Timestamp column in the destination table |
-> Day | Start time when creating table fresh |
-> Integer | N days to go bac |
-> TableSpec b |
rawSqlSpec :: SpecTableName -> SpecTarget b -> FilePath -> [Ref Table] -> TableSpec b #
Read a file that contains raw SQL query code that can be used to instantiate a table.
rawSqlMustacheSpec :: SpecTableName -> SpecTarget b -> FilePath -> SqlTemplateVariables -> [Ref Table] -> TableSpec b #
Same as rawSqlSpec
but allows for mustache templating inside of
the raw SQL file.
Arguments
:: SpecTableName | the new table to create |
-> Ref Table | the long table from which this table will be derived- make sure it is also listed in the dependencies |
-> (SExp -> SExp) | Aggregate function |
-> [Alias SExp] | the key columns which will remain in the resultant wide version as-is |
-> SExp | the column name in the long table which will be split into multiple columns in the wide version |
-> SExp | the column in the long table which will be emitted from matching on the new columns |
-> (Value -> Ref SExp) | a function to generate column names from the values found in the database |
-> SpecTarget b | standard table options |
-> [Ref Table] | create a view or table | this table's dependencies (include the long table) |
-> TableSpec b |
Query the "long" version of the table to determine what columns to put in the "wide" version. This function does not support mustache templates.
Arguments
:: SpecTableName | the name of the new table |
-> Text | command |
-> [Text] | arguments |
-> [Ref Table] | the list of dependencies - these cannot be deduced |
-> TableSpec b |
A custom Spec which runs a command to create a table
Arguments
:: SpecTableName | the name of the new table |
-> Text | command |
-> [Ref Table] | the list of dependencies - these cannot be deduced |
-> TableSpec b |
A custom Spec which runs a shell script to create a table
Arguments
:: HasBackendSchemaField b | |
=> SpecTableName | |
-> SpecTarget b | |
-> (Query -> Query) | Any final optional query modification |
-> [Relation] | List of sources to combine |
-> TableSpec b |
Specialized convenience for UNION-ing several tables and queries,
even for cases where the list of fields available in each table is
not known at compile time. This will introspect list of fields for
cases where a bare table name is given instead of a QueryRelation
.
addHooks :: [(Text, [SpecTableName], PureGlobalHookProgram b)] -> Spec b () #
addHooks' :: [(Text, [SpecTableName], SpecGlobalHook b)] -> Spec b () #
addIOHooks :: [(Text, [SpecTableName], IOGlobalHookProgram b)] -> Spec b () #
Adds global hook, description, dependencies and hook's specification
addTags :: [TableSpecTag] -> Spec b a -> Spec b a #