Safe Haskell | None |
---|---|
Language | GHC2021 |
Ide.Plugin.Splice.Types
Synopsis
- data ExpandSpliceParams = ExpandSpliceParams {
- verTxtDocId :: VersionedTextDocumentIdentifier
- spliceSpan :: RealSrcSpan
- spliceContext :: SpliceContext
- data SpliceContext
- data ExpandStyle
- expandStyles :: [(ExpandStyle, (Text, CommandId))]
- toExpandCmdTitle :: ExpandStyle -> Text
- toCommandId :: ExpandStyle -> CommandId
- expandInplaceId :: CommandId
- expandCommentedId :: CommandId
- inplaceCmdName :: Text
- commentedCmdName :: Text
Documentation
data ExpandSpliceParams Source #
Parameter for the addMethods PluginCommand.
Constructors
ExpandSpliceParams | |
Fields
|
Instances
data SpliceContext Source #
Instances
FromJSON SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods parseJSON :: Value -> Parser SpliceContext # parseJSONList :: Value -> Parser [SpliceContext] # | |||||
ToJSON SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods toJSON :: SpliceContext -> Value # toEncoding :: SpliceContext -> Encoding # toJSONList :: [SpliceContext] -> Value # toEncodingList :: [SpliceContext] -> Encoding # omitField :: SpliceContext -> Bool # | |||||
Generic SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Associated Types
| |||||
Read SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods readsPrec :: Int -> ReadS SpliceContext # readList :: ReadS [SpliceContext] # | |||||
Show SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods showsPrec :: Int -> SpliceContext -> ShowS # show :: SpliceContext -> String # showList :: [SpliceContext] -> ShowS # | |||||
Eq SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods (==) :: SpliceContext -> SpliceContext -> Bool # (/=) :: SpliceContext -> SpliceContext -> Bool # | |||||
Ord SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods compare :: SpliceContext -> SpliceContext -> Ordering # (<) :: SpliceContext -> SpliceContext -> Bool # (<=) :: SpliceContext -> SpliceContext -> Bool # (>) :: SpliceContext -> SpliceContext -> Bool # (>=) :: SpliceContext -> SpliceContext -> Bool # max :: SpliceContext -> SpliceContext -> SpliceContext # min :: SpliceContext -> SpliceContext -> SpliceContext # | |||||
type Rep SpliceContext Source # | |||||
Defined in Ide.Plugin.Splice.Types type Rep SpliceContext = D1 ('MetaData "SpliceContext" "Ide.Plugin.Splice.Types" "haskell-language-server-2.11.0.0-2UZr7U10ZET6GWPaTrLB3D-hls-splice-plugin" 'False) ((C1 ('MetaCons "Expr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HsDecl" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Pat" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HsType" 'PrefixI 'False) (U1 :: Type -> Type))) |
data ExpandStyle Source #
Instances
Generic ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types Associated Types
| |||||
Read ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods readsPrec :: Int -> ReadS ExpandStyle # readList :: ReadS [ExpandStyle] # readPrec :: ReadPrec ExpandStyle # readListPrec :: ReadPrec [ExpandStyle] # | |||||
Show ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods showsPrec :: Int -> ExpandStyle -> ShowS # show :: ExpandStyle -> String # showList :: [ExpandStyle] -> ShowS # | |||||
Eq ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types | |||||
Ord ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types Methods compare :: ExpandStyle -> ExpandStyle -> Ordering # (<) :: ExpandStyle -> ExpandStyle -> Bool # (<=) :: ExpandStyle -> ExpandStyle -> Bool # (>) :: ExpandStyle -> ExpandStyle -> Bool # (>=) :: ExpandStyle -> ExpandStyle -> Bool # max :: ExpandStyle -> ExpandStyle -> ExpandStyle # min :: ExpandStyle -> ExpandStyle -> ExpandStyle # | |||||
type Rep ExpandStyle Source # | |||||
Defined in Ide.Plugin.Splice.Types |
expandStyles :: [(ExpandStyle, (Text, CommandId))] Source #
toExpandCmdTitle :: ExpandStyle -> Text Source #
toCommandId :: ExpandStyle -> CommandId Source #