Pretty Void | Finding a good example for printing something that does not exist is hard,
so here is an example of printing a list full of nothing. >>> pretty ([] :: [Void])
[]
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Int16 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Int32 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Int64 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Int8 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Word16 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Word32 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Word64 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Word8 | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty BodyType Source # | |
Instance detailsDefined in Futhark.Analysis.AccessPattern |
Pretty SegOpName Source # | |
Instance detailsDefined in Futhark.Analysis.AccessPattern |
Pretty VarType Source # | |
Instance detailsDefined in Futhark.Analysis.AccessPattern |
Pretty CallGraph Source # | |
Instance detailsDefined in Futhark.Analysis.CallGraph |
Pretty ArrayTransform Source # | |
Instance detailsDefined in Futhark.Analysis.HORep.SOAC |
Pretty Input Source # | |
Instance detailsDefined in Futhark.Analysis.HORep.SOAC |
Pretty MemAliases Source # | |
Instance detailsDefined in Futhark.Analysis.MemAlias |
Pretty PyArg Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyClassDef Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyExcept Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyExp Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyFunDef Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyIdx Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyProg Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty PyStmt Source # | |
Instance detailsDefined in Futhark.CodeGen.Backends.GenericPython.AST |
Pretty Arg Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty ArrayContents Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty EntryPoint Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty ExternalValue Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty Param Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty ValueDesc Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty HostOp Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.GPU |
Pretty Kernel Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.GPU |
Pretty KernelConst Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.GPU |
Pretty KernelOp Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.GPU |
Pretty KernelUse Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.GPU |
Pretty Multicore Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.Multicore |
Pretty ParallelTask Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.Multicore |
Pretty SchedulerInfo Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.Multicore |
Pretty Scheduling Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.Multicore |
Pretty OpenCL Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.OpenCL |
Pretty Sequential Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode.Sequential |
Pretty DeviceInfo Source # | |
Instance detailsDefined in Futhark.CodeGen.OpenCL.Heuristics |
Pretty AliasDec Source # | |
Instance detailsDefined in Futhark.IR.Aliases |
Pretty KernelGrid Source # | |
Instance detailsDefined in Futhark.IR.GPU.Op |
Pretty SegLevel Source # | |
Instance detailsDefined in Futhark.IR.GPU.Op |
Pretty SegVirt Source # | |
Instance detailsDefined in Futhark.IR.GPU.Op |
Pretty SizeOp Source # | |
Instance detailsDefined in Futhark.IR.GPU.Op |
Pretty SizeClass Source # | |
Instance detailsDefined in Futhark.IR.GPU.Sizes |
Pretty MemBind Source # | |
Instance detailsDefined in Futhark.IR.Mem |
Pretty MemReturn Source # | |
Instance detailsDefined in Futhark.IR.Mem |
Pretty Names Source # | |
Instance detailsDefined in Futhark.IR.Prop.Names |
Pretty KernelResult Source # | |
Instance detailsDefined in Futhark.IR.SegOp |
Pretty SegSpace Source # | |
Instance detailsDefined in Futhark.IR.SegOp |
Pretty BasicOp Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty EntryParam Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty EntryResult Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty SubExpRes Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Attr Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Attrs Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Certs Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Commutativity Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty EntryPointType Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty ExtShape Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Ident Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty OpaqueType Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty OpaqueTypes Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Rank Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Shape Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Signedness Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty Space Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty SubExp Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty ValueType Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty AccessSummary Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty ArrayMemBound Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty Coalesced Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty CoalescedKind Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty CoalsEntry Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty CoalsTab Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty MemRefs Source # | |
Instance detailsDefined in Futhark.Optimise.ArrayShortCircuiting.DataStructs |
Pretty VarWisdom Source # | |
Instance detailsDefined in Futhark.Optimise.Simplify.Rep |
Pretty Exp Source # | |
Instance detailsDefined in Futhark.Script |
Pretty Func Source # | |
Instance detailsDefined in Futhark.Script |
Pretty ScriptValueType Source # | |
Instance detailsDefined in Futhark.Script |
Pretty Name Source # | |
Instance detailsDefined in Language.Futhark.Core |
Pretty NoUniqueness Source # | |
Instance detailsDefined in Language.Futhark.Core |
Pretty Uniqueness Source # | |
Instance detailsDefined in Language.Futhark.Core |
Pretty VName Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty BinOp Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty CmpOp Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty ConvOp Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty FloatType Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty FloatValue Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty IntType Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty IntValue Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty PrimType Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty PrimValue Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty UnOp Source # | |
Instance detailsDefined in Language.Futhark.Primitive |
Pretty Env Source # | |
Instance detailsDefined in Language.Futhark.Semantic |
Pretty MTy Source # | |
Instance detailsDefined in Language.Futhark.Semantic |
Pretty Mod Source # | |
Instance detailsDefined in Language.Futhark.Semantic |
Pretty Namespace Source # | |
Instance detailsDefined in Language.Futhark.Semantic |
Pretty BinOp Source # | |
Instance detailsDefined in Language.Futhark.Syntax |
Pretty Diet Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty Liftedness Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty PatLit Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty PrimType Source # | |
Instance detailsDefined in Language.Futhark.Syntax |
Pretty PrimValue Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty Notes Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Monad |
Pretty Checking Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Terms.Monad |
Pretty BreadCrumbs Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Unify |
Pretty Usage Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Unify |
Pretty Value Source # | |
Instance detailsDefined in Futhark.Test.Values |
Pretty ValueType Source # | |
Instance detailsDefined in Futhark.Test.Values |
Pretty Half Source # | |
Instance detailsDefined in Futhark.Util.Pretty |
Pretty LspServerLog | |
Instance detailsDefined in Language.LSP.Server.Control |
Pretty LspCoreLog | |
Instance detailsDefined in Language.LSP.Server.Core |
Pretty VfsLog | |
Instance detailsDefined in Language.LSP.VFS |
Pretty AnnotatedTextEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.AnnotatedTextEdit |
Pretty ApplyWorkspaceEditParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ApplyWorkspaceEditParams |
Pretty ApplyWorkspaceEditResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ApplyWorkspaceEditResult |
Pretty BaseSymbolInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.BaseSymbolInformation |
Pretty CallHierarchyClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyClientCapabilities |
Pretty CallHierarchyIncomingCall | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyIncomingCall |
Pretty CallHierarchyIncomingCallsParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyIncomingCallsParams |
Pretty CallHierarchyItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyItem |
Pretty CallHierarchyOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyOptions |
Pretty CallHierarchyOutgoingCall | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyOutgoingCall |
Pretty CallHierarchyOutgoingCallsParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyOutgoingCallsParams |
Pretty CallHierarchyPrepareParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyPrepareParams |
Pretty CallHierarchyRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CallHierarchyRegistrationOptions |
Pretty CancelParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CancelParams |
Pretty ChangeAnnotation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ChangeAnnotation |
Pretty ChangeAnnotationIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ChangeAnnotationIdentifier |
Pretty ClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ClientCapabilities |
Pretty CodeAction | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeAction |
Pretty CodeActionClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionClientCapabilities |
Pretty CodeActionContext | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionContext |
Pretty CodeActionKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionKind |
Pretty CodeActionOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionOptions |
Pretty CodeActionParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionParams |
Pretty CodeActionRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionRegistrationOptions |
Pretty CodeActionTriggerKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeActionTriggerKind |
Pretty CodeDescription | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeDescription |
Pretty CodeLens | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLens |
Pretty CodeLensClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLensClientCapabilities |
Pretty CodeLensOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLensOptions |
Pretty CodeLensParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLensParams |
Pretty CodeLensRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLensRegistrationOptions |
Pretty CodeLensWorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CodeLensWorkspaceClientCapabilities |
Pretty Color | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Color |
Pretty ColorInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ColorInformation |
Pretty ColorPresentation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ColorPresentation |
Pretty ColorPresentationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ColorPresentationParams |
Pretty Command | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Command |
Pretty CompletionClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionClientCapabilities |
Pretty CompletionContext | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionContext |
Pretty CompletionItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionItem |
Pretty CompletionItemKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionItemKind |
Pretty CompletionItemLabelDetails | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionItemLabelDetails |
Pretty CompletionItemTag | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionItemTag |
Pretty CompletionList | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionList |
Pretty CompletionOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionOptions |
Pretty CompletionParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionParams |
Pretty CompletionRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionRegistrationOptions |
Pretty CompletionTriggerKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CompletionTriggerKind |
Pretty ConfigurationItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ConfigurationItem |
Pretty ConfigurationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ConfigurationParams |
Pretty CreateFile | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CreateFile |
Pretty CreateFileOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CreateFileOptions |
Pretty CreateFilesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.CreateFilesParams |
Pretty Declaration | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Declaration |
Pretty DeclarationClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeclarationClientCapabilities |
Pretty DeclarationLink | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeclarationLink |
Pretty DeclarationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeclarationOptions |
Pretty DeclarationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeclarationParams |
Pretty DeclarationRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeclarationRegistrationOptions |
Pretty Definition | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Definition |
Pretty DefinitionClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DefinitionClientCapabilities |
Pretty DefinitionLink | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DefinitionLink |
Pretty DefinitionOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DefinitionOptions |
Pretty DefinitionParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DefinitionParams |
Pretty DefinitionRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DefinitionRegistrationOptions |
Pretty DeleteFile | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeleteFile |
Pretty DeleteFileOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeleteFileOptions |
Pretty DeleteFilesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DeleteFilesParams |
Pretty Diagnostic | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Diagnostic |
Pretty DiagnosticClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticClientCapabilities |
Pretty DiagnosticOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticOptions |
Pretty DiagnosticRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticRegistrationOptions |
Pretty DiagnosticRelatedInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticRelatedInformation |
Pretty DiagnosticServerCancellationData | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticServerCancellationData |
Pretty DiagnosticSeverity | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticSeverity |
Pretty DiagnosticTag | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticTag |
Pretty DiagnosticWorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DiagnosticWorkspaceClientCapabilities |
Pretty DidChangeConfigurationClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeConfigurationClientCapabilities |
Pretty DidChangeConfigurationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeConfigurationParams |
Pretty DidChangeConfigurationRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeConfigurationRegistrationOptions |
Pretty DidChangeNotebookDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeNotebookDocumentParams |
Pretty DidChangeTextDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeTextDocumentParams |
Pretty DidChangeWatchedFilesClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeWatchedFilesClientCapabilities |
Pretty DidChangeWatchedFilesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeWatchedFilesParams |
Pretty DidChangeWatchedFilesRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeWatchedFilesRegistrationOptions |
Pretty DidChangeWorkspaceFoldersParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidChangeWorkspaceFoldersParams |
Pretty DidCloseNotebookDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidCloseNotebookDocumentParams |
Pretty DidCloseTextDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidCloseTextDocumentParams |
Pretty DidOpenNotebookDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidOpenNotebookDocumentParams |
Pretty DidOpenTextDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidOpenTextDocumentParams |
Pretty DidSaveNotebookDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidSaveNotebookDocumentParams |
Pretty DidSaveTextDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DidSaveTextDocumentParams |
Pretty DocumentColorClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentColorClientCapabilities |
Pretty DocumentColorOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentColorOptions |
Pretty DocumentColorParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentColorParams |
Pretty DocumentColorRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentColorRegistrationOptions |
Pretty DocumentDiagnosticParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentDiagnosticParams |
Pretty DocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentDiagnosticReport |
Pretty DocumentDiagnosticReportKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentDiagnosticReportKind |
Pretty DocumentDiagnosticReportPartialResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentDiagnosticReportPartialResult |
Pretty DocumentFilter | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentFilter |
Pretty DocumentFormattingClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentFormattingClientCapabilities |
Pretty DocumentFormattingOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentFormattingOptions |
Pretty DocumentFormattingParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentFormattingParams |
Pretty DocumentFormattingRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentFormattingRegistrationOptions |
Pretty DocumentHighlight | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlight |
Pretty DocumentHighlightClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlightClientCapabilities |
Pretty DocumentHighlightKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlightKind |
Pretty DocumentHighlightOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlightOptions |
Pretty DocumentHighlightParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlightParams |
Pretty DocumentHighlightRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentHighlightRegistrationOptions |
Pretty DocumentLink | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentLink |
Pretty DocumentLinkClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentLinkClientCapabilities |
Pretty DocumentLinkOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentLinkOptions |
Pretty DocumentLinkParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentLinkParams |
Pretty DocumentLinkRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentLinkRegistrationOptions |
Pretty DocumentOnTypeFormattingClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentOnTypeFormattingClientCapabilities |
Pretty DocumentOnTypeFormattingOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentOnTypeFormattingOptions |
Pretty DocumentOnTypeFormattingParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentOnTypeFormattingParams |
Pretty DocumentOnTypeFormattingRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentOnTypeFormattingRegistrationOptions |
Pretty DocumentRangeFormattingClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentRangeFormattingClientCapabilities |
Pretty DocumentRangeFormattingOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentRangeFormattingOptions |
Pretty DocumentRangeFormattingParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentRangeFormattingParams |
Pretty DocumentRangeFormattingRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentRangeFormattingRegistrationOptions |
Pretty DocumentSelector | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSelector |
Pretty DocumentSymbol | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSymbol |
Pretty DocumentSymbolClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSymbolClientCapabilities |
Pretty DocumentSymbolOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSymbolOptions |
Pretty DocumentSymbolParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSymbolParams |
Pretty DocumentSymbolRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.DocumentSymbolRegistrationOptions |
Pretty ErrorCodes | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ErrorCodes |
Pretty ExecuteCommandClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ExecuteCommandClientCapabilities |
Pretty ExecuteCommandOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ExecuteCommandOptions |
Pretty ExecuteCommandParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ExecuteCommandParams |
Pretty ExecuteCommandRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ExecuteCommandRegistrationOptions |
Pretty ExecutionSummary | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ExecutionSummary |
Pretty FailureHandlingKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FailureHandlingKind |
Pretty FileChangeType | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileChangeType |
Pretty FileCreate | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileCreate |
Pretty FileDelete | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileDelete |
Pretty FileEvent | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileEvent |
Pretty FileOperationClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationClientCapabilities |
Pretty FileOperationFilter | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationFilter |
Pretty FileOperationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationOptions |
Pretty FileOperationPattern | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationPattern |
Pretty FileOperationPatternKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationPatternKind |
Pretty FileOperationPatternOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationPatternOptions |
Pretty FileOperationRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileOperationRegistrationOptions |
Pretty FileRename | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileRename |
Pretty FileSystemWatcher | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FileSystemWatcher |
Pretty FoldingRange | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRange |
Pretty FoldingRangeClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRangeClientCapabilities |
Pretty FoldingRangeKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRangeKind |
Pretty FoldingRangeOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRangeOptions |
Pretty FoldingRangeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRangeParams |
Pretty FoldingRangeRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FoldingRangeRegistrationOptions |
Pretty FormattingOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FormattingOptions |
Pretty FullDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.FullDocumentDiagnosticReport |
Pretty GeneralClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.GeneralClientCapabilities |
Pretty GlobPattern | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.GlobPattern |
Pretty Hover | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Hover |
Pretty HoverClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.HoverClientCapabilities |
Pretty HoverOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.HoverOptions |
Pretty HoverParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.HoverParams |
Pretty HoverRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.HoverRegistrationOptions |
Pretty ImplementationClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ImplementationClientCapabilities |
Pretty ImplementationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ImplementationOptions |
Pretty ImplementationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ImplementationParams |
Pretty ImplementationRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ImplementationRegistrationOptions |
Pretty InitializeError | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InitializeError |
Pretty InitializeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InitializeParams |
Pretty InitializeResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InitializeResult |
Pretty InitializedParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InitializedParams |
Pretty InlayHint | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHint |
Pretty InlayHintClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintClientCapabilities |
Pretty InlayHintKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintKind |
Pretty InlayHintLabelPart | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintLabelPart |
Pretty InlayHintOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintOptions |
Pretty InlayHintParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintParams |
Pretty InlayHintRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintRegistrationOptions |
Pretty InlayHintWorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlayHintWorkspaceClientCapabilities |
Pretty InlineValue | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValue |
Pretty InlineValueClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueClientCapabilities |
Pretty InlineValueContext | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueContext |
Pretty InlineValueEvaluatableExpression | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueEvaluatableExpression |
Pretty InlineValueOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueOptions |
Pretty InlineValueParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueParams |
Pretty InlineValueRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueRegistrationOptions |
Pretty InlineValueText | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueText |
Pretty InlineValueVariableLookup | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueVariableLookup |
Pretty InlineValueWorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InlineValueWorkspaceClientCapabilities |
Pretty InsertReplaceEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InsertReplaceEdit |
Pretty InsertTextFormat | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InsertTextFormat |
Pretty InsertTextMode | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.InsertTextMode |
Pretty LSPErrorCodes | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LSPErrorCodes |
Pretty LinkedEditingRangeClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LinkedEditingRangeClientCapabilities |
Pretty LinkedEditingRangeOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LinkedEditingRangeOptions |
Pretty LinkedEditingRangeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LinkedEditingRangeParams |
Pretty LinkedEditingRangeRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LinkedEditingRangeRegistrationOptions |
Pretty LinkedEditingRanges | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LinkedEditingRanges |
Pretty Location | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Location |
Pretty LocationLink | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LocationLink |
Pretty LogMessageParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LogMessageParams |
Pretty LogTraceParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.LogTraceParams |
Pretty MarkdownClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MarkdownClientCapabilities |
Pretty MarkedString | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MarkedString |
Pretty MarkupContent | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MarkupContent |
Pretty MarkupKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MarkupKind |
Pretty MessageActionItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MessageActionItem |
Pretty MessageType | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MessageType |
Pretty Moniker | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Moniker |
Pretty MonikerClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MonikerClientCapabilities |
Pretty MonikerKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MonikerKind |
Pretty MonikerOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MonikerOptions |
Pretty MonikerParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MonikerParams |
Pretty MonikerRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.MonikerRegistrationOptions |
Pretty NotebookCell | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookCell |
Pretty NotebookCellArrayChange | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookCellArrayChange |
Pretty NotebookCellKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookCellKind |
Pretty NotebookCellTextDocumentFilter | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookCellTextDocumentFilter |
Pretty NotebookDocument | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocument |
Pretty NotebookDocumentChangeEvent | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentChangeEvent |
Pretty NotebookDocumentClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentClientCapabilities |
Pretty NotebookDocumentFilter | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentFilter |
Pretty NotebookDocumentIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentIdentifier |
Pretty NotebookDocumentSyncClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentSyncClientCapabilities |
Pretty NotebookDocumentSyncOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentSyncOptions |
Pretty NotebookDocumentSyncRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.NotebookDocumentSyncRegistrationOptions |
Pretty OptionalVersionedTextDocumentIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.OptionalVersionedTextDocumentIdentifier |
Pretty ParameterInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ParameterInformation |
Pretty PartialResultParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PartialResultParams |
Pretty Pattern | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Pattern |
Pretty Position | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Position |
Pretty PositionEncodingKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PositionEncodingKind |
Pretty PrepareRenameParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PrepareRenameParams |
Pretty PrepareRenameResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PrepareRenameResult |
Pretty PrepareSupportDefaultBehavior | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PrepareSupportDefaultBehavior |
Pretty PreviousResultId | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PreviousResultId |
Pretty ProgressParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ProgressParams |
Pretty ProgressToken | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ProgressToken |
Pretty PublishDiagnosticsClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PublishDiagnosticsClientCapabilities |
Pretty PublishDiagnosticsParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.PublishDiagnosticsParams |
Pretty Range | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Range |
Pretty ReferenceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ReferenceClientCapabilities |
Pretty ReferenceContext | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ReferenceContext |
Pretty ReferenceOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ReferenceOptions |
Pretty ReferenceParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ReferenceParams |
Pretty ReferenceRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ReferenceRegistrationOptions |
Pretty Registration | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Registration |
Pretty RegistrationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RegistrationParams |
Pretty RegularExpressionsClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RegularExpressionsClientCapabilities |
Pretty RelatedFullDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RelatedFullDocumentDiagnosticReport |
Pretty RelatedUnchangedDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RelatedUnchangedDocumentDiagnosticReport |
Pretty RelativePattern | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RelativePattern |
Pretty RenameClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameClientCapabilities |
Pretty RenameFile | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameFile |
Pretty RenameFileOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameFileOptions |
Pretty RenameFilesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameFilesParams |
Pretty RenameOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameOptions |
Pretty RenameParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameParams |
Pretty RenameRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.RenameRegistrationOptions |
Pretty ResourceOperation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ResourceOperation |
Pretty ResourceOperationKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ResourceOperationKind |
Pretty SaveOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SaveOptions |
Pretty SelectionRange | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SelectionRange |
Pretty SelectionRangeClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SelectionRangeClientCapabilities |
Pretty SelectionRangeOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SelectionRangeOptions |
Pretty SelectionRangeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SelectionRangeParams |
Pretty SelectionRangeRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SelectionRangeRegistrationOptions |
Pretty SemanticTokenModifiers | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokenModifiers |
Pretty SemanticTokenTypes | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokenTypes |
Pretty SemanticTokens | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokens |
Pretty SemanticTokensClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensClientCapabilities |
Pretty SemanticTokensDelta | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensDelta |
Pretty SemanticTokensDeltaParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensDeltaParams |
Pretty SemanticTokensDeltaPartialResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensDeltaPartialResult |
Pretty SemanticTokensEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensEdit |
Pretty SemanticTokensLegend | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensLegend |
Pretty SemanticTokensOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensOptions |
Pretty SemanticTokensParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensParams |
Pretty SemanticTokensPartialResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensPartialResult |
Pretty SemanticTokensRangeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensRangeParams |
Pretty SemanticTokensRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensRegistrationOptions |
Pretty SemanticTokensWorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SemanticTokensWorkspaceClientCapabilities |
Pretty ServerCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ServerCapabilities |
Pretty SetTraceParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SetTraceParams |
Pretty ShowDocumentClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowDocumentClientCapabilities |
Pretty ShowDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowDocumentParams |
Pretty ShowDocumentResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowDocumentResult |
Pretty ShowMessageParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowMessageParams |
Pretty ShowMessageRequestClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowMessageRequestClientCapabilities |
Pretty ShowMessageRequestParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.ShowMessageRequestParams |
Pretty SignatureHelp | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelp |
Pretty SignatureHelpClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpClientCapabilities |
Pretty SignatureHelpContext | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpContext |
Pretty SignatureHelpOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpOptions |
Pretty SignatureHelpParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpParams |
Pretty SignatureHelpRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpRegistrationOptions |
Pretty SignatureHelpTriggerKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureHelpTriggerKind |
Pretty SignatureInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SignatureInformation |
Pretty StaticRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.StaticRegistrationOptions |
Pretty SymbolInformation | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SymbolInformation |
Pretty SymbolKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SymbolKind |
Pretty SymbolTag | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.SymbolTag |
Pretty TextDocumentChangeRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentChangeRegistrationOptions |
Pretty TextDocumentClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentClientCapabilities |
Pretty TextDocumentContentChangeEvent | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentContentChangeEvent |
Pretty TextDocumentEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentEdit |
Pretty TextDocumentFilter | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentFilter |
Pretty TextDocumentIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentIdentifier |
Pretty TextDocumentItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentItem |
Pretty TextDocumentPositionParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentPositionParams |
Pretty TextDocumentRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentRegistrationOptions |
Pretty TextDocumentSaveReason | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentSaveReason |
Pretty TextDocumentSaveRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentSaveRegistrationOptions |
Pretty TextDocumentSyncClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentSyncClientCapabilities |
Pretty TextDocumentSyncKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentSyncKind |
Pretty TextDocumentSyncOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextDocumentSyncOptions |
Pretty TextEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TextEdit |
Pretty TokenFormat | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TokenFormat |
Pretty TraceValues | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TraceValues |
Pretty TypeDefinitionClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeDefinitionClientCapabilities |
Pretty TypeDefinitionOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeDefinitionOptions |
Pretty TypeDefinitionParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeDefinitionParams |
Pretty TypeDefinitionRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeDefinitionRegistrationOptions |
Pretty TypeHierarchyClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchyClientCapabilities |
Pretty TypeHierarchyItem | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchyItem |
Pretty TypeHierarchyOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchyOptions |
Pretty TypeHierarchyPrepareParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchyPrepareParams |
Pretty TypeHierarchyRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchyRegistrationOptions |
Pretty TypeHierarchySubtypesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchySubtypesParams |
Pretty TypeHierarchySupertypesParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.TypeHierarchySupertypesParams |
Pretty UInitializeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.UInitializeParams |
Pretty UnchangedDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.UnchangedDocumentDiagnosticReport |
Pretty UniquenessLevel | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.UniquenessLevel |
Pretty Unregistration | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.Unregistration |
Pretty UnregistrationParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.UnregistrationParams |
Pretty VersionedNotebookDocumentIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.VersionedNotebookDocumentIdentifier |
Pretty VersionedTextDocumentIdentifier | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.VersionedTextDocumentIdentifier |
Pretty WatchKind | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WatchKind |
Pretty WillSaveTextDocumentParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WillSaveTextDocumentParams |
Pretty WindowClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WindowClientCapabilities |
Pretty WorkDoneProgressBegin | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressBegin |
Pretty WorkDoneProgressCancelParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressCancelParams |
Pretty WorkDoneProgressCreateParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressCreateParams |
Pretty WorkDoneProgressEnd | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressEnd |
Pretty WorkDoneProgressOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressOptions |
Pretty WorkDoneProgressParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressParams |
Pretty WorkDoneProgressReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkDoneProgressReport |
Pretty WorkspaceClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceClientCapabilities |
Pretty WorkspaceDiagnosticParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceDiagnosticParams |
Pretty WorkspaceDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceDiagnosticReport |
Pretty WorkspaceDiagnosticReportPartialResult | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceDiagnosticReportPartialResult |
Pretty WorkspaceDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceDocumentDiagnosticReport |
Pretty WorkspaceEdit | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceEdit |
Pretty WorkspaceEditClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceEditClientCapabilities |
Pretty WorkspaceFolder | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceFolder |
Pretty WorkspaceFoldersChangeEvent | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceFoldersChangeEvent |
Pretty WorkspaceFoldersInitializeParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceFoldersInitializeParams |
Pretty WorkspaceFoldersServerCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceFoldersServerCapabilities |
Pretty WorkspaceFullDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceFullDocumentDiagnosticReport |
Pretty WorkspaceSymbol | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceSymbol |
Pretty WorkspaceSymbolClientCapabilities | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceSymbolClientCapabilities |
Pretty WorkspaceSymbolOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceSymbolOptions |
Pretty WorkspaceSymbolParams | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceSymbolParams |
Pretty WorkspaceSymbolRegistrationOptions | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceSymbolRegistrationOptions |
Pretty WorkspaceUnchangedDocumentDiagnosticReport | |
Instance detailsDefined in Language.LSP.Protocol.Internal.Types.WorkspaceUnchangedDocumentDiagnosticReport |
Pretty SomeClientMethod | |
Instance detailsDefined in Language.LSP.Protocol.Message.Method |
Pretty SomeServerMethod | |
Instance detailsDefined in Language.LSP.Protocol.Message.Method |
Pretty SomeRegistration | |
Instance detailsDefined in Language.LSP.Protocol.Message.Registration |
Pretty SomeUnregistration | |
Instance detailsDefined in Language.LSP.Protocol.Message.Registration |
Pretty NotificationMessage | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
Pretty RequestMessage | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
Pretty ResponseError | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
Pretty ResponseMessage | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
Pretty Null | |
Instance detailsDefined in Language.LSP.Protocol.Types.Common |
Pretty UInt | |
Instance detailsDefined in Language.LSP.Protocol.Types.Common |
Pretty NormalizedUri | |
Instance detailsDefined in Language.LSP.Protocol.Types.Uri |
Pretty Uri | |
Instance detailsDefined in Language.LSP.Protocol.Types.Uri |
Pretty Text | Automatically converts all newlines to line . >>> pretty ("hello\nworld" :: Text)
hello
world
Note that line can be undone by group : >>> group (pretty ("hello\nworld" :: Text))
hello world
Manually use hardline if you definitely want newlines. |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Text | (lazy Doc instance, identical to the strict version) |
Instance detailsDefined in Prettyprinter.Internal |
Pretty Integer | >>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Natural | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty () | >>> pretty ()
()
The argument is not used: >>> pretty (error "Strict?" :: ())
()
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Bool | >>> pretty True
True
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Char | Instead of (pretty 'n') , consider using line as a more readable
alternative. >>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Double | >>> pretty (exp 1 :: Double)
2.71828182845904...
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Float | >>> pretty (pi :: Float)
3.1415927
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Int | >>> pretty (123 :: Int)
123
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty Word | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty a => Pretty (Identity a) | >>> pretty (Identity 1)
1
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty a => Pretty (NonEmpty a) | |
Instance detailsDefined in Prettyprinter.Internal |
PrettyRep rep => Pretty (SOAC rep) Source # | |
Instance detailsDefined in Futhark.Analysis.HORep.SOAC |
Pretty v => Pretty (PrimExp v) Source # | |
Instance detailsDefined in Futhark.Analysis.PrimExp |
Pretty op => Pretty (Code op) Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty op => Pretty (Constants op) Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty op => Pretty (Definitions op) Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty op => Pretty (FunctionT op) Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty op => Pretty (Functions op) Source # | |
Instance detailsDefined in Futhark.CodeGen.ImpCode |
Pretty num => Pretty (LMAD num) Source # | |
Instance detailsDefined in Futhark.IR.Mem.LMAD |
PrettyRep rep => Pretty (Reduce rep) Source # | |
Instance detailsDefined in Futhark.IR.SOACS.SOAC |
PrettyRep rep => Pretty (SOAC rep) Source # | |
Instance detailsDefined in Futhark.IR.SOACS.SOAC |
PrettyRep rep => Pretty (Scan rep) Source # | |
Instance detailsDefined in Futhark.IR.SOACS.SOAC |
PrettyRep rep => Pretty (KernelBody rep) Source # | |
Instance detailsDefined in Futhark.IR.SegOp |
PrettyRep rep => Pretty (SegBinOp rep) Source # | |
Instance detailsDefined in Futhark.IR.SegOp |
PrettyRep rep => Pretty (Body rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Case (Body rep)) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Exp rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (FunDef rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Lambda rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty t => Pretty (Pat t) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Prog rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Stm rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
PrettyRep rep => Pretty (Stms rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty d => Pretty (DimIndex d) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty a => Pretty (ErrorMsg a) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty a => Pretty (Ext a) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty d => Pretty (FlatDimIndex d) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty a => Pretty (FlatSlice a) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty t => Pretty (Param t) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty t => Pretty (PatElem t) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty a => Pretty (Slice a) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty v => Pretty (Compound v) Source # | |
Instance detailsDefined in Futhark.Test.Values |
Pretty d => Pretty (Shape d) Source # | |
Instance detailsDefined in Language.Futhark.Interpreter.Values |
IsName vn => Pretty (QualName vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (Shape Int64) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (Shape Size) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (Shape ()) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (Shape Bool) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
IsName vn => Pretty (SizeBinder vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty d => Pretty (SizeExp d) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (TypeArg Size) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn) => Pretty (TypeParamBase vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (Match t) Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Match |
Pretty t => Pretty (Subst t) Source # | |
Instance detailsDefined in Language.Futhark.TypeChecker.Types |
Pretty (AString s) | |
Instance detailsDefined in Language.LSP.Protocol.Types.Singletons |
Pretty (AnInteger n) | |
Instance detailsDefined in Language.LSP.Protocol.Types.Singletons |
Pretty a => Pretty (Maybe a) | Ignore Nothing s, print Just contents. >>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty a => Pretty [a] | >>> pretty [1,2,3]
[1, 2, 3]
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty (DimAccess rep) Source # | |
Instance detailsDefined in Futhark.Analysis.AccessPattern |
Pretty (IndexTable rep) Source # | |
Instance detailsDefined in Futhark.Analysis.AccessPattern |
(PrettyRep rep, Pretty (op rep)) => Pretty (HostOp op rep) Source # | |
Instance detailsDefined in Futhark.IR.GPU.Op |
(PrettyRep rep, Pretty (op rep)) => Pretty (MCOp op rep) Source # | |
Instance detailsDefined in Futhark.IR.MC.Op |
Pretty (inner rep) => Pretty (MemOp inner rep) Source # | |
Instance detailsDefined in Futhark.IR.Mem |
Pretty (NoOp rep) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
(PrettyRep rep, Pretty lvl) => Pretty (SegOp lvl rep) Source # | |
Instance detailsDefined in Futhark.IR.SegOp |
Pretty u => Pretty (TypeBase ExtShape u) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty u => Pretty (TypeBase Rank u) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
Pretty u => Pretty (TypeBase Shape u) Source # | |
Instance detailsDefined in Futhark.IR.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (AppExpBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
IsName vn => Pretty (AttrAtom vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
IsName vn => Pretty (AttrInfo vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (CaseBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (DecBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (DimIndexBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ExpBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (FieldBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (LoopFormBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ModBindBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ModExpBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ModParamBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ModTypeBindBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ModTypeExpBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ProgBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Pretty (Shape dim), Pretty u) => Pretty (RetTypeBase dim u) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Pretty (Shape dim), Pretty u) => Pretty (ScalarTypeBase dim u) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (SpecBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Pretty d, IsName vn) => Pretty (TypeArgExp d vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Pretty (Shape dim), Pretty u) => Pretty (TypeBase dim u) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (TypeBindBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(IsName vn, Pretty d) => Pretty (TypeExp d vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
(Eq vn, IsName vn, Annot f) => Pretty (ValBindBase f vn) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
Pretty (LspId m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.LspId |
Pretty (TRegistration m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Registration |
Pretty (TUnregistration m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Registration |
ToJSON (MessageParams m) => Pretty (TNotificationMessage m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
ToJSON (MessageParams m) => Pretty (TRequestMessage m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
ToJSON (ErrorData m) => Pretty (TResponseError m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
(ToJSON (MessageResult m), ToJSON (ErrorData m)) => Pretty (TResponseMessage m) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
(ToJSON a, ToJSON b) => Pretty (a |? b) | |
Instance detailsDefined in Language.LSP.Protocol.Types.Common |
(Pretty a1, Pretty a2) => Pretty (a1, a2) | >>> pretty (123, "hello")
(123, hello)
|
Instance detailsDefined in Prettyprinter.Internal |
Pretty a => Pretty (Const a b) | |
Instance detailsDefined in Prettyprinter.Internal |
Pretty v => Pretty (TPrimExp t v) Source # | |
Instance detailsDefined in Futhark.Analysis.PrimExp |
Pretty e => Pretty (Count u e) Source # | |
Instance detailsDefined in Futhark.IR.GPU.Sizes |
(Pretty (ShapeBase d), Pretty (TypeBase (ShapeBase d) u), Pretty d, Pretty u, Pretty ret) => Pretty (MemInfo d u ret) Source # | |
Instance detailsDefined in Futhark.IR.Mem |
(Eq vn, IsName vn, Annot f, Pretty t) => Pretty (PatBase f vn t) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |
KnownSymbol s => Pretty (TCustomMessage s f t) | |
Instance detailsDefined in Language.LSP.Protocol.Message.Types |
(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3) | >>> pretty (123, "hello", False)
(123, hello, False)
|
Instance detailsDefined in Prettyprinter.Internal |
IsName vn => Pretty (IdentBase f vn t) Source # | |
Instance detailsDefined in Language.Futhark.Pretty |