h&WJ      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~None 3None 3&None 3] None 3fhintThis represents language extensions beyond Haskell 98 that are supported by GHC (it was taken from Cabal's Language.Haskell.Extension)hint0List of the extensions known by the interpreter.n&tmqlihg^vp`aJK/SNMDETVxyz{|}~ None 3@hint!Module names are _not_ filepaths.hint*Represent module import statement. See  setImportsFhintGhcExceptions from the underlying GHC API are caught and rethrown as this.hint.Version of the underlying ghc api. Values are:804 for GHC 8.4.x806 for GHC 8.6.xetc...? None 3 None 3 , None 3 c None 3!hintAn Id for a class, a type constructor, a data constructor, a binding, etchintGets an abstract representation of all the entities exported by the module. It is similar to the :browse command in GHCi.None 3$jhint>Returns a string representation of the type of the expression.hint$Tests if the expression type checks.NB. Be careful if (unsafeSetGhcOption "-fdefer-type-errors"9 is used. Perhaps unsurprisingly, that can falsely make  typeChecks and typeChecksWithDetails return True and Right _ respectively.hint Similar to  typeChecks3, but gives more information, e.g. the type errors.hintReturns a string representation of the kind of the type expression.hintReturns a string representation of the normalized type expression. This is what the :kind! GHCi command prints after =.None 3$None 3$None 3)hintAvailable options are:hintUse this function to set or modify the value of any option. It is invoked like this: 1set [opt1 := val1, opt2 := val2,... optk := valk]hint!Retrieves the value of an option.hint.Language extensions in use by the interpreter. Default is: [] (i.e. none, pure Haskell 98)hint When set to True, every module in every available package is implicitly imported qualified. This is very convenient for interactive evaluation, but can be a problem in sandboxed environments (e.g.  is in scope).Default value is True.DETVxyz{|}~None 37 hintTries to load all the requested modules from their source file. Modules my be indicated by their ModuleName (e.g. "My.Module") or by the full path to its source file. Note that in order to use code from that module, you also need to call 3 (to use the exported types and definitions) or 4 (to also use the private types and definitions).The interpreter is ? both before loading the modules and in the event of an error. IMPORTANT: Like in a ghci session, this will also load (and interpret) any dependency that is not available via an installed package. Make sure that you are not loading any module that is also being used to compile your application. In particular, you need to avoid modules that define types that will later occur in an expression that you will want to interpret.The problem in doing this is that those types will have two incompatible representations at runtime: 1) the one in the compiled code and 2) the one in the interpreted code. When interpreting such an expression (bringing it to program-code) you will likely get a segmentation fault, since the latter representation will be used where the program assumes the former.The rule of thumb is: never make the interpreter run on the directory with the source code of your program! If you want your interpreted code to use some type that is defined in your program, then put the defining module on a library and make your program depend on that package.hint+Returns True if the module was interpreted.hint(Returns the list of modules loaded with .hintSets the modules whose context is used during evaluation. All bindings of these modules are in scope, not only those exported.1Modules must be interpreted to use this function.hintSets the modules whose exports must be in context. These can be modules previously loaded with , or modules from packages which hint is aware of. This includes package databases specified to unsafeRunInterpreterWithArgs by the -package-db=... parameter, and packages specified by a ghc environment file created by 0cabal build --write-ghc-environment-files=always. Warning: , , and  are mutually exclusive. If you have a list of modules to be used qualified and another list unqualified, then you need to do something like ? setImportsQ ((zip unqualified $ repeat Nothing) ++ qualifieds)hint A variant of + where modules them may be qualified. e.g.:setImportsQ [(Prelude , Nothing), (Data.Map, Just M)].Here, "map" will refer to Prelude.map and "M.map" to Data.Map.map.hint A variant of 6 where modules may have an explicit import list. e.g.: setImportsF [ModuleImport Prelude) NotQualified NoImportList, ModuleImport  Data.Text (QualifiedAs $ Just Text) (HidingList ["pack"])]hint works like ?, but skips the loading of the support module that installs _show. Its purpose is to clean up all temporary files generated for phantom modules.hintAll imported modules are cleared from the context, and loaded modules are unloaded. It is similar to a :load in GHCi, but observe that not even the Prelude will be in context after a reset.None 3:hintThe installed version of ghc is not thread-safe. This exception is thrown whenever you try to execute runInterpreter. while another instance is already running.hint"Executes the interpreter. Returns Left InterpreterError in case of error.NB. In hint-0.7.0 and earlier, the underlying ghc was accidentally overwriting certain signal handlers (SIGINT, SIGHUP, SIGTERM, SIGQUIT on Posix systems, Ctrl-C handler on Windows).hintExecutes the interpreter, setting args passed in as though they were command-line args. Returns Left InterpreterError in case of error.None 3@mhint&Convenience functions to be used with  interpret" to provide witnesses. Example: *interpret "head [True,False]" (as :: Bool) interpret "head $ map show [True,False]" infer >>= flip interpret (as :: Bool)hint&Convenience functions to be used with  interpret" to provide witnesses. Example: *interpret "head [True,False]" (as :: Bool) interpret "head $ map show [True,False]" infer >>= flip interpret (as :: Bool)hintEvaluates an expression, given a witness for its monomorphic type.hint eval expr will evaluate  show expr. It will succeed only if expr has type t and there is a  instance for t.hintEvaluate a statement in the # monad, possibly binding new names.Example: *runStmt "x <- return 42" runStmt "print x"hintConceptually, parens s = "(" ++ s ++ ")", where s is any valid haskell expression. In practice, it is harder than this. Observe that if s$ ends with a trailing comment, then parens s would be a malformed expression. The straightforward solution for this is to put the closing parenthesis in a different line. However, now we are messing with the layout rules and we don't know where s" is going to be used! Solution: 2parens s = "(let {foo =\n" ++ s ++ "\n ;} in foo)" where foo does not occur in sNone 3@n&tmqlihg^vp`aJK/SNMDETVxyz{|}~n&tmqlihg^vp`aJK/SNMDETVxyz{|}~None 3D~}|{zyxVTED>"!  UWs3O45'()Gf[u@e6$wr0]b.,-C12HILXYZ:o%7_PQR89jk;c #\AB?F* =+dDETVxyz{|}~None 3Jhint1Set a GHC option for the current session, eg. 0unsafeSetGhcOption "-XNoMonomorphismRestriction".>Warning: Some options may interact badly with the Interpreter.hintExecutes the interpreter, setting the args as though they were command-line args. In particular, this means args that have no effect with :set in ghci might function properly from this context.>Warning: Some options may interact badly with the Interpreter.hint A variant of unsafeRunInterpreterWithArgs which also lets you specify the folder in which the GHC bootstrap libraries (base, containers, etc.) can be found. This allows you to run hint on a machine in which GHC is not installed. A typical libdir value could be usrlib ghc-8.0.1 ghc-8.0.1. !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hint-0.9.0.7-inplaceLanguage.Haskell.Interpreter&Language.Haskell.Interpreter.Extension Hint.Internal#Language.Haskell.Interpreter.UnsafeControl.Monad.GhcHint.CompatPlatformHint.GHCHint.Extension Hint.BaseHint.ConversionsHint.Annotations Hint.ParsersHint.ReflectionHint.Typecheck Hint.UtilHint.Configuration System.UnsafeunsafePerformIO Hint.ContextHint.InterpreterT Hint.Eval ExtensionOverlappingInstancesUndecidableInstancesIncoherentInstancesDoRec RecursiveDoParallelListCompMultiParamTypeClassesMonomorphismRestrictionFunctionalDependencies Rank2Types RankNTypesPolymorphicComponentsExistentialQuantificationScopedTypeVariablesPatternSignaturesImplicitParamsFlexibleContextsFlexibleInstancesEmptyDataDeclsCPPKindSignatures BangPatternsTypeSynonymInstancesTemplateHaskellForeignFunctionInterfaceArrowsGenericsImplicitPreludeNamedFieldPuns PatternGuardsGeneralizedNewtypeDerivingExtensibleRecordsRestrictedTypeSynonyms HereDocuments MagicHash TypeFamiliesStandaloneDeriving UnicodeSyntaxUnliftedFFITypesInterruptibleFFICApiFFILiberalTypeSynonyms TypeOperatorsRecordWildCards RecordPunsDisambiguateRecordFieldsTraditionalRecordSyntaxOverloadedStringsGADTs GADTSyntax MonoPatBindsRelaxedPolyRecExtendedDefaultRules UnboxedTuplesDeriveDataTypeable DeriveGenericDefaultSignatures InstanceSigsConstrainedClassMethodsPackageImportsImpredicativeTypesNewQualifiedOperatorsPostfixOperators QuasiQuotesTransformListCompMonadComprehensions ViewPatterns XmlSyntaxRegularPatterns TupleSectionsGHCForeignImportPrimNPlusKPatternsDoAndIfThenElse MultiWayIf LambdaCaseRebindableSyntaxExplicitForAllDatatypeContextsMonoLocalBinds DeriveFunctorDeriveTraversableDeriveFoldableNondecreasingIndentation SafeImportsSafe TrustworthyUnsafeConstraintKinds PolyKinds DataKindsParallelArraysRoleAnnotationsOverloadedLists EmptyCaseAutoDeriveTypeableNegativeLiteralsBinaryLiterals NumDecimalsNullaryTypeClassesExplicitNamespacesAllowAmbiguousTypes JavaScriptFFIPatternSynonymsPartialTypeSignaturesNamedWildCardsDeriveAnyClass DeriveLiftStaticPointers StrictDataStrict ApplicativeDoDuplicateRecordFieldsTypeApplications TypeInTypeUndecidableSuperClassesMonadFailDesugaringTemplateHaskellQuotesOverloadedLabelsTypeFamilyDependenciesNoOverlappingInstancesNoUndecidableInstancesNoIncoherentInstancesNoDoRec NoRecursiveDoNoParallelListCompNoMultiParamTypeClassesNoMonomorphismRestrictionNoFunctionalDependencies NoRank2Types NoRankNTypesNoPolymorphicComponentsNoExistentialQuantificationNoScopedTypeVariablesNoPatternSignaturesNoImplicitParamsNoFlexibleContextsNoFlexibleInstancesNoEmptyDataDeclsNoCPPNoKindSignaturesNoBangPatternsNoTypeSynonymInstancesNoTemplateHaskellNoForeignFunctionInterfaceNoArrows NoGenericsNoImplicitPreludeNoNamedFieldPunsNoPatternGuardsNoGeneralizedNewtypeDerivingNoExtensibleRecordsNoRestrictedTypeSynonymsNoHereDocuments NoMagicHashNoTypeFamiliesNoStandaloneDerivingNoUnicodeSyntaxNoUnliftedFFITypesNoInterruptibleFFI NoCApiFFINoLiberalTypeSynonymsNoTypeOperatorsNoRecordWildCards NoRecordPunsNoDisambiguateRecordFieldsNoTraditionalRecordSyntaxNoOverloadedStringsNoGADTs NoGADTSyntaxNoMonoPatBindsNoRelaxedPolyRecNoExtendedDefaultRulesNoUnboxedTuplesNoDeriveDataTypeableNoDeriveGenericNoDefaultSignaturesNoInstanceSigsNoConstrainedClassMethodsNoPackageImportsNoImpredicativeTypesNoNewQualifiedOperatorsNoPostfixOperators NoQuasiQuotesNoTransformListCompNoMonadComprehensionsNoViewPatterns NoXmlSyntaxNoRegularPatternsNoTupleSectionsNoGHCForeignImportPrimNoNPlusKPatternsNoDoAndIfThenElse NoMultiWayIf NoLambdaCaseNoRebindableSyntaxNoExplicitForAllNoDatatypeContextsNoMonoLocalBindsNoDeriveFunctorNoDeriveTraversableNoDeriveFoldableNoNondecreasingIndentation NoSafeImportsNoSafe NoTrustworthyNoUnsafeNoConstraintKinds NoPolyKinds NoDataKindsNoParallelArraysNoRoleAnnotationsNoOverloadedLists NoEmptyCaseNoAutoDeriveTypeableNoNegativeLiteralsNoBinaryLiterals NoNumDecimalsNoNullaryTypeClassesNoExplicitNamespacesNoAllowAmbiguousTypesNoJavaScriptFFINoPatternSynonymsNoPartialTypeSignaturesNoNamedWildCardsNoDeriveAnyClass NoDeriveLiftNoStaticPointers NoStrictDataNoStrictNoApplicativeDoNoDuplicateRecordFieldsNoTypeApplications NoTypeInTypeNoUndecidableSuperClassesNoMonadFailDesugaringNoTemplateHaskellQuotesNoOverloadedLabelsNoTypeFamilyDependenciesUnknownExtensionsupportedExtensionsavailableExtensions asExtension ModuleNameGhcErrorerrMsg ModuleImportmodNamemodQualmodImpModuleQualification NotQualifiedImportAs QualifiedAs ImportList NoImportList HidingListInterpreterError UnknownError WontCompile NotAllowed GhcExceptionMonadInterpreter fromSessionmodifySessionRefrunGhc ghcVersiongetModuleAnnotationsgetValAnnotations ModuleElemFunClassDataIdnamechildrengetModuleExportstypeOf typeCheckstypeChecksWithDetailskindOf normalizeTypeonCompilationError OptionVal:=OptionsetgetlanguageExtensionsinstalledModulesInScope searchPath loadModulesisModuleInterpretedgetLoadedModulessetTopLevelModules setImports setImportsQ setImportsFresetMultipleInstancesNotAllowed InterpreterT InterpreterrunInterpreterasinfer interpretunsafeInterpretevalrunStmtparensunsafeSetGhcOptionunsafeRunInterpreterWithArgs"unsafeRunInterpreterWithArgsLibdirGhcTrunGhcTgetPIDghcGHCparser lookupNameobtainTermFromIdobtainTermFromValgetHistorySpan getGHCiMonad setGHCiMonadmoduleTrustReqsisModuleTrusted lookupModule findModuleshowRichTokenStreamaddSourceToTokensgetRichTokenStreamgetTokenStreampprParenSymName dataConTypegetNameToInstancesIndexgetGREfindGlobalAnnslookupGlobalName isDictonaryIdmodInfoModBreaks modInfoSafe modInfoRdrEnv modInfoIfacemodInfoLookupNamemkPrintUnqualifiedForModulemodInfoIsExportedNamemodInfoInstancesmodInfoExportsWithSelectorsmodInfoExportsmodInfoTopLevelScopemodInfoTyThings getModuleInfogetPrintUnqualgetInsts getBindingsisLoadedgetModuleGraphcompileToCoreSimplifiedcompileToCoreModule loadModule desugarModuletypecheckModule parseModule getModSummaryworkingDirectoryChanged removeTarget addTarget getTargets setTargetsgetInteractiveDynFlagssetInteractiveDynFlagsgetProgramDynFlags setLogActionsetProgramDynFlagssetSessionDynFlags initGhcMonadwithCleanupSessiondefaultCleanupHandlerdefaultErrorHandler ParsedMod parsedSourceTypecheckedMod moduleInfo renamedSourcetypecheckedSource ParsedModulepm_annotationspm_extra_src_filespm_mod_summarypm_parsed_sourceTypecheckedModule tm_internals_tm_checked_module_infotm_typechecked_sourcetm_parsed_moduletm_renamed_sourceDesugaredModuledm_typechecked_moduledm_core_module ParsedSource RenamedSourceTypecheckedSource CoreModulecm_safecm_binds cm_modulecm_types ModuleInfoGhcMakecyclicModuleErrtopSortModuleGraphloaddepanal LoadHowMuchLoadDependenciesOfLoadAllTargetsLoadUpToInteractiveEvalreconstructTypemoduleIsBootOrNotObjectLinkable showModuledynCompileExprcompileParsedExprcompileParsedExprRemotecompileExprRemote compileExpr parseExprparseInstanceHeadgetInstancesForTypetypeKindexprTypegetDocsisDeclisImport hasImportisStmt parseNamegetRdrNamesInScopegetNamesInScopegetInfomoduleIsInterpreted getContext setContext abandonAllabandonforwardback resumeExecparseImportDeclrunParsedDeclsrunDeclsWithLocationrunDecls execStmt'execStmt execOptionsgetHistoryModulegetResumeContextGetDocsFailureInteractiveNameNameHasNoModule NoDocsInIface TcRnDriverrunTcInteractive TcRnExprMode TM_DefaultTM_Inst TM_NoInst PprTyThing pprFamInstParser parseType parseStmtGhcMonaddefaultWarnErrLoggerprintExceptiongetSessionDynFlags getSession setSessionGhc WarnErrLoggerHscTypes ms_mod_name mkModuleGraphemptyMGmgLookupModulemgModSummariesmapMGneedsTemplateHaskellOrQQhandleSourceErrorsrcErrorMessages SourceError GhcApiErrorHscEnvTargettargetContentstargetIdtargetAllowObjCodeTargetId TargetModule TargetFileModIface ModIface_ mi_final_exts mi_arg_docs mi_decl_docs mi_doc_hdrmi_complete_sigs mi_trust_pkgmi_trustmi_hpcmi_rules mi_fam_instsmi_insts mi_globalsmi_declsmi_annsmi_warns mi_fixities mi_used_th mi_exports mi_usagesmi_deps mi_hsc_src mi_module mi_sig_ofInteractiveImportIIDeclIIModule ModuleGraph ModSummary ms_hspp_buf ms_hspp_opts ms_hspp_file ms_parsed_modms_textual_imps ms_srcimps ms_hie_date ms_iface_date ms_obj_date ms_hs_date ms_locationms_mod ms_hsc_srcGHC.HsHsModulehsmodHaddockModHeaderhsmodDeprecMessage hsmodDecls hsmodImports hsmodName hsmodExports GHC.Hs.Utils lPatImplicitshsValBindsImplicitslStmtsImplicitshsDataFamInstBindersgetPatSynBindshsPatSynSelectorshsForeignDeclsBindershsLTyClDeclBindershsTyClForeignBindershsGroupBinderscollectPatsBinderscollectPatBinderscollectStmtBinderscollectLStmtBinderscollectStmtsBinderscollectLStmtsBinderscollectMethodBinderscollectHsBindListBinderscollectHsBindsBinderscollectHsBindBinderscollectHsValBinderscollectHsIdBinderscollectLocalBindersisBangedHsBindisUnliftedHsBindmkMatchmkPrefixFunRhsmkSimpleGeneratedFunBindisInfixFunBind mkPatSynBind mkVarBind mkHsVarBind mkTopFunBind mkFunBind mkHsDictLet mkHsWrapPatCo mkHsWrapPat mkLHsCmdWrap mkHsCmdWrap mkLHsWrapCo mkHsWrapCoR mkHsWrapComkHsWrap mkLHsWrap typeToLHsType mkClassOpSigs mkHsSigEnvmkLHsSigWcType mkLHsSigTypechunkify mkChunkifiedmkBigLHsPatTupmkBigLHsVarPatTup mkBigLHsTupmkBigLHsVarTup missingTupArg nlTuplePat mkLHsVarTuplemkLHsTupleExpr nlHsAppKindTy nlHsTyConApp nlHsParTy nlHsFunTy nlHsTyVar nlHsAppTynlListnlHsCasenlHsIfnlHsParnlHsLam nlHsOpAppnlHsDo nlWildPatName nlWildPat nlWildConPatnlNullaryConPat nlConPatNamenlConPat nlInfixConPatnlConVarPatName nlConVarPat nlHsVarAppsnlHsAppsnlHsSyntaxAppsnlHsAppnlLitPatnlVarPat nlHsIntLitnlHsLit nlHsDataConnlHsVarmkHsStringPrimLit mkHsStringunqualQuasiQuotemkHsQuasiQuote mkTypedSplicemkUntypedSplice mkHsOpApp mkRecStmtemptyRecStmtIdemptyRecStmtName emptyRecStmt unitRecStmtTc mkTcBindStmt mkBindStmt mkBodyStmt mkLastStmtmkGroupByUsingStmtmkGroupUsingStmtmkTransformByStmtmkTransformStmtemptyTransStmt mkNPlusKPatmkNPat mkHsCmdIfmkHsIfmkHsCompmkHsDo mkHsIsStringmkHsFractional mkHsIntegralnlParPatmkParPatmkLHsPar nlHsTyApps nlHsTyApp mkHsCaseAltmkHsLamsmkHsLam mkHsAppTypes mkHsAppTypemkHsApp mkMatchGroup unguardedRHSunguardedGRHSs mkSimpleMatchmkHsPar GHC.Hs.Expr pprStmtInCtxtpprMatchInCtxtmatchContextErrStringpprStmtContextpprAStmtContextpprMatchContextNounpprMatchContextmatchSeparatorisMonadCompContextisMonadFailStmtContextisComprehensionContext isPatSynCtxt pp_dotdot thTyBrackets thBrackets pprHsBracketisTypedBracket ppr_splice ppr_quasippr_splice_declpprPendingSplice isTypedSplicepprQualspprComp ppr_do_stmtspprDopprBy pprTransStmtpprTransformStmtpprArgpprStmtpp_rhspprGRHSpprGRHSspprMatch pprMatches hsLMatchPatsmatchGroupArityisSingletonMatchGroupisEmptyMatchGroup isInfixMatch pprCmdArgppr_cmdppr_lcmd isQuietHsCmdpprCmdpprLCmdisAtomicHsExprparenthesizeHsExprhsExprNeedsParens pprParendExprpprParendLExprpprDebugParendExprpprExternalSrcLocppr_appsppr_infix_exprppr_expr ppr_lexprpprBinds isQuietHsExpr tupArgPresent unboundVarOccmkRnSyntaxExpr mkSyntaxExpr noSyntaxExprnoExpr PostTcExpr PostTcTableCmdSyntaxTable UnboundVar OutOfScope TrueExprHole RecordConTc rcon_con_like rcon_con_expr RecordUpdTc rupd_wrap rupd_out_tys rupd_cons rupd_in_tys LHsTupArgHsTupArgXTupArgPresentMissingLHsCmd HsArrAppTypeHsHigherOrderAppHsFirstOrderApp LHsCmdTopHsCmdTopXCmdTopCmdTopTc HsRecordBinds MatchGroupTc mg_arg_tys mg_res_tyLMatchMatchXMatchm_grhssm_patsm_extm_ctxtLGRHSGRHSXGRHSLStmtLStmtLRStmtCmdLStmtCmdStmt ExprLStmtExprStmt GuardLStmt GuardStmt GhciLStmtGhciStmtStmtLRXStmtLRRecStmt TransStmtParStmtLetStmtBodyStmtApplicativeStmtLastStmtBindStmt recS_mfix_fn recS_ret_fn recS_bind_fn recS_rec_idsrecS_later_ids recS_stmtsrecS_exttrS_fmaptrS_bindtrS_rettrS_by trS_using trS_bndrs trS_stmtstrS_exttrS_form RecStmtTc recS_ret_ty recS_rec_rets recS_bind_tyrecS_later_rets TransFormThenForm GroupForm ParStmtBlock XParStmtBlockApplicativeArgXApplicativeArgApplicativeArgOneApplicativeArgMany bv_pattern final_expr app_stmtsxarg_app_arg_many fail_operator is_body_stmtarg_exprxarg_app_arg_oneapp_arg_patternSpliceDecorationNoParens HasParens HasDollarThModFinalizers DelayedSpliceHsSplicedThing HsSplicedPat HsSplicedExpr HsSplicedTySplicePointNamePendingRnSpliceUntypedSpliceFlavourUntypedDeclSpliceUntypedTypeSpliceUntypedExpSpliceUntypedPatSplicePendingTcSplice HsBracketTExpBrVarBrTypBrDecBrGDecBrLPatBrXBracketExpBr ArithSeqInfo FromThenToFromToFromFromThenHsMatchContext ThPatQuote ThPatSpliceStmtCtxtRecUpd PatBindGuards PatBindRhsProcExprIfAltCaseAlt LambdaExprPatSynFunRhs mc_strictnessmc_fun mc_fixity HsStmtContext TransStmtCtxt ParStmtCtxtPatGuard GhciStmtCtxt ArrowExprMDoExprDoExprListComp MonadComp GHC.Hs.DeclsroleAnnotDeclNameannProvenanceName_maybe docDeclDocpprFullRuleNamecollectRuleBndrSigTysflattenRuleDeclsmapDerivStrategyfoldDerivStrategyderivStrategyNameinstDeclDataFamInstspprHsFamInstLHSpprDataFamInstFlavourpprTyFamInstDeclhsConDeclThetahsConDeclArgTys getConArgs getConNamesnewOrDataToFlavourstandaloneKindSigNameresultVariableNamefamResultKindSignaturefamilyDeclNamefamilyDeclLNametyClGroupKindSigstyClGroupRoleDeclstyClGroupInstDeclstyClGroupTyClDeclspprTyClDeclFlavour hsDeclHasCuskcountTyClDeclstyClDeclTyVarstcdName tyClDeclLNametyFamInstDeclLNametyFamInstDeclNameisDataFamilyDeclisClosedTypeFamilyInfoisOpenTypeFamilyInfoisTypeFamilyDecl isFamilyDecl isClassDecl isSynDecl isDataDecl appendGroupshsGroupInstDecls emptyRnGroup emptyRdrGroupLHsDeclHsDeclXHsDecl RoleAnnotDDocDSpliceDRuleDAnnDWarningDForDDefDKindSigDSigDValDDerivDTyClDInstDHsGroupXHsGrouphs_docs hs_ruledshs_annds hs_warndshs_fordshs_defdshs_fixds hs_derivds hs_tyclds hs_splcdshs_exths_valds LSpliceDecl SpliceDecl XSpliceDecl LTyClDeclTyClDecl XTyClDecl ClassDeclDataDeclFamDeclSynDecltcdDocs tcdATDefstcdATstcdMethstcdSigstcdFDstcdCtxttcdCExt tcdDataDefntcdDExttcdRhs tcdFixity tcdTyVarstcdLNametcdSExttcdFExttcdFam LHsFunDep DataDeclRn tcdDataCusktcdFVs TyClGroup XTyClGroup group_instds group_kisigs group_roles group_ext group_tycldsLFamilyResultSigFamilyResultSigXFamilyResultSigTyVarSigNoSigKindSig LFamilyDecl FamilyDecl XFamilyDeclfdInjectivityAnn fdResultSigfdFixityfdTyVarsfdLNamefdExtfdInfoLInjectivityAnnInjectivityAnn FamilyInfoClosedTypeFamily DataFamilyOpenTypeFamily HsDataDefn XHsDataDefn dd_derivsdd_cons dd_kindSigdd_cTypedd_ctxtdd_extdd_ND HsDerivingLHsDerivingClauseHsDerivingClauseXHsDerivingClausederiv_clause_tysderiv_clause_extderiv_clause_strategyLStandaloneKindSigStandaloneKindSigXStandaloneKindSig NewOrDataDataTypeNewTypeLConDeclConDeclXConDecl ConDeclGADT ConDeclH98 con_ex_tvscon_namecon_extcon_doc con_res_tycon_args con_mb_cxt con_qvars con_forall con_g_ext con_namesHsConDeclDetails LTyFamInstEqnHsTyPats TyFamInstEqnTyFamDefltDeclLTyFamDefltDeclLTyFamInstDecl TyFamInstDecltfid_eqnLDataFamInstDeclDataFamInstDecldfid_eqn LFamInstEqn FamInstEqnFamEqnXFamEqnfeqn_rhs feqn_fixity feqn_pats feqn_bndrsfeqn_ext feqn_tycon LClsInstDecl ClsInstDecl XClsInstDeclcid_overlap_modecid_datafam_instscid_tyfam_instscid_sigs cid_bindscid_ext cid_poly_ty LInstDeclInstDecl XInstDecl TyFamInstDClsInstD DataFamInstD tfid_insttfid_ext dfid_instdfid_ext cid_d_extcid_inst LDerivDecl DerivDecl XDerivDeclderiv_overlap_modederiv_strategy deriv_ext deriv_typeLDerivStrategy DerivStrategy ViaStrategyNewtypeStrategy StockStrategyAnyclassStrategy LDefaultDecl DefaultDecl XDefaultDecl LForeignDecl ForeignDecl XForeignDecl ForeignExport ForeignImportfd_fefd_e_extfd_fi fd_sig_tyfd_i_extfd_nameCImport CImportSpecCWrapperCLabel CFunctionCExport LRuleDecls RuleDeclsHsRules XRuleDecls rds_rulesrds_extrds_src LRuleDeclRuleDeclHsRule XRuleDeclrd_rhsrd_lhsrd_tmvsrd_tyvsrd_actrd_extrd_nameHsRuleRn LRuleBndrRuleBndr XRuleBndr RuleBndrSigLDocDeclDocDeclDocGroupDocCommentNamedDocCommentNextDocCommentPrev LWarnDecls WarnDeclsWarnings XWarnDecls wd_warningswd_extwd_src LWarnDeclWarnDeclWarning XWarnDeclLAnnDeclAnnDecl HsAnnotationXAnnDecl AnnProvenanceModuleAnnProvenanceValueAnnProvenanceTypeAnnProvenanceLRoleAnnotDecl RoleAnnotDeclXRoleAnnotDecl GHC.Hs.PatcollectEvVarsPatcollectEvVarsPatsparenthesizePatpatNeedsParensisIrrefutableHsPatlooksLazyPatBind isBangedLPat mkCharLitPatmkNilPatmkPrefixConPat pprConArgs pprParendLPathsRecUpdFieldOcchsRecUpdFieldIdhsRecUpdFieldRdr hsRecFieldId hsRecFieldSelhsRecFieldsArgs hsRecFields hsConPatArgsInPatOutPat ListPatTcHsConPatDetails HsRecFieldsrec_flds rec_dotdot LHsRecField' LHsRecFieldLHsRecUpdField HsRecField HsRecUpdField HsRecField'hsRecPun hsRecFieldLbl hsRecFieldArg GHC.Hs.Binds pprMinimalSigpprTcSpecPragspprSpec pprVarSigpragSrcBrackets pragBracketsppr_sighsSigDocisCompleteMatchSig isSCCFunSig isMinimalLSig isInlineLSig isPragLSigisSpecInstLSig isSpecLSig isTypeLSig isFixityLSigisDefaultMethod hasSpecPrags noSpecPragsisEmptyIPBindsTcisEmptyIPBindsPRpprTicks ppr_monobindplusHsValBindsisEmptyLHsBinds emptyLHsBindsemptyValBindsOutemptyValBindsInisEmptyValBindseqEmptyLocalBindsisEmptyLocalBindsPRisEmptyLocalBindsTcemptyLocalBinds pprDeclListpprLHsBindsForUser pprLHsBinds HsLocalBinds LHsLocalBindsHsLocalBindsLRXHsLocalBindsLREmptyLocalBinds HsIPBinds HsValBindsLHsLocalBindsLR HsValBindsLRValBinds XValBindsLR NHsValBindsLR NValBindsLHsBindLHsBindsHsBind LHsBindsLR LHsBindLRHsBindLR XHsBindsLRAbsBindsVarBindPatBind PatSynBindFunBindabs_sig abs_binds abs_ev_binds abs_exports abs_ev_varsabs_tvsabs_ext var_inlinevar_rhsvar_idvar_ext pat_tickspat_rhspat_lhspat_extfun_tick fun_co_fn fun_matchesfun_extfun_id NPatBindTcpat_fvs pat_rhs_tyABExportABE XABExport abe_pragsabe_wrapabe_monoabe_extabe_poly XPatSynBindPSBpsb_dirpsb_defpsb_argspsb_extpsb_id XHsIPBindsIPBindsLIPBindIPBindXIPBindLSigSigXSigCompleteMatchSig SCCFunSig MinimalSig SpecInstSigSpecSig InlineSigFixSigIdSig ClassOpSigTypeSig PatSynSig LFixitySig FixitySig XFixitySig TcSpecPragsIsDefaultMethod SpecPrags LTcSpecPrag TcSpecPragSpecPragHsPatSynDetailsRecordPatSynFieldrecordPatSynSelectorIdrecordPatSynPatVar HsPatSynDirExplicitBidirectionalUnidirectionalImplicitBidirectionalInstEnvpprInstanceHdr pprInstanceinstanceDFunIdClsInst FamInstEnvFamInst ByteCodeTypes BreakIndex ModBreaksmodBreaks_breakInfo modBreaks_ccsmodBreaks_declsmodBreaks_varsmodBreaks_flagsmodBreaks_locs GHC.Hs.TypesparenthesizeHsContextparenthesizeHsTypehsTypeNeedsParens pprHsTypepprConDeclFields pprLHsContextpprHsExplicitForAllpprHsForAllExtra pprHsForAllpprAnonWildCardambiguousFieldOccunambiguousFieldOccselectorAmbiguousFieldOccrdrNameAmbiguousFieldOccmkAmbiguousFieldOcc mkFieldOccgetLHsInstDeclClass_maybegetLHsInstDeclHeadsplitLHsInstDeclTysplitLHsQualTysplitLHsForAllTyInvissplitLHsSigmaTyInvissplitLHsPatSynTynumVisibleArgshsTyGetAppHead_maybesplitHsFunType mkHsAppKindTy mkHsAppTys mkHsAppTymkHsOpTymkAnonWildCardTy isLHsForAllTy ignoreParens hsTyKindSighsLTyVarBndrsToTypeshsLTyVarBndrToTypehsLTyVarLocNameshsLTyVarLocNamehsAllLTyVarNameshsExplicitLTyVarNames hsLTyVarNames hsLTyVarName hsTyVarName hsScopedTvs hsWcScopedTvshsConDetailsArgshsTvbAllKindedisHsKindedTyVar hsIPNameFSmkEmptyWildCardBndrsmkEmptyImplicitBndrsmkHsWildCardBndrsmkHsImplicitBndrs dropWildCards hsSigWcType hsSigTypehsImplicitBodyisEmptyLHsQTvs emptyLHsQTvs hsQTvExplicitmkHsQTvs noLHsContextgetBangStrictness getBangType LBangTypeBangType LHsContext HsContextLHsTypeHsKindLHsKind LHsTyVarBndr LHsQTyVarsHsQTvs XLHsQTyVarshsq_ext hsq_explicitHsImplicitBndrsHsIBXHsImplicitBndrshsib_ext hsib_bodyHsWildCardBndrsHsWCXHsWildCardBndrshswc_ext hswc_body LHsSigType LHsWcType LHsSigWcTypeHsIPName HsTyVarBndr XTyVarBndr UserTyVar KindedTyVarHsTypeXHsType HsWildCardTyHsExplicitTupleTyHsExplicitListTyHsRecTyHsBangTyHsDocTy HsSpliceTy HsKindSigHsStarTy HsIParamTyHsParTyHsOpTyHsSumTy HsTupleTyHsListTyHsFunTy HsAppKindTyHsAppTyHsTyVarHsQualTyHsTyLit HsForAllTyhst_ctxt hst_xqualhst_body hst_bndrs hst_xforallhst_fvf NewHsTypeX NHsCoreTyHsNumTyHsStrTy HsTupleSortHsBoxedOrConstraintTupleHsConstraintTupleHsUnboxedTuple HsBoxedTuple LConDeclField ConDeclField XConDeclField cd_fld_doc cd_fld_type cd_fld_ext cd_fld_names HsConDetailsInfixCon PrefixConRecConHsArgHsArgParHsValArg HsTypeArg LHsTypeArg LFieldOccFieldOcc XFieldOcc extFieldOccrdrNameFieldOccAmbiguousFieldOccXAmbiguousFieldOcc Unambiguous AmbiguousInteractiveEvalTypes ExecOptionsexecWrapexecLineNumberexecSingleStepexecSourceFile SingleStepRunAndLogStepsRunToCompletion ExecResult ExecComplete ExecBreak breakInfo breakNames execResultexecAllocation BreakInfobreakInfo_modulebreakInfo_numberResumeresumeHistoryIx resumeHistory resumeCCS resumeDecl resumeSpanresumeBreakInfo resumeApStackresumeFinalIdsresumeBindings resumeStmt resumeContextHistoryhistoryBreakInfohistoryEnclosingDecls isBottomingId isDeadBinder isImplicitId idDataConisDataConWorkId isFCallId isPrimOpIdisClassOpId_maybeisRecordSelectorrecordSelectorTyConidTypeDataConisVanillaDataCondataConUserType dataConSigdataConSrcBangsdataConIsInfixisMarkedStrict HsSrcBang HsImplBangHsUnpackHsLazyHsStrict SrcStrictness NoSrcStrictSrcLazy SrcStrictSrcUnpackedness NoSrcUnpack SrcUnpack SrcNoUnpackStrictnessMark MarkedStrictNotMarkedStrict GHC.Hs.LithsOverLitNeedsParenshsLitNeedsParens pmPprHsLit pp_st_suffix convertLit overLitTypenegateOverLitValHsLitXLit HsDoublePrim HsFloatPrimHsRat HsInteger HsWord64Prim HsInt64Prim HsWordPrim HsIntPrimHsInt HsStringPrimHsStringHsChar HsCharPrim HsOverLitXOverLitOverLit ol_witnessol_extol_val OverLitTc ol_rebindableol_type OverLitVal HsIsString HsIntegral HsFractionalTypesplitForAllTys funResultTyTyCoPpr pprTypeApp pprForAllpprThetaArrowTy pprParendTypeTysPrim alphaTyVarsTyContyConClass_maybe isClassTyConsynTyConRhs_maybesynTyConDefn_maybe tyConDataConsisOpenTypeFamilyTyConisTypeFamilyTyConisOpenFamilyTyCon isFamilyTyConisTypeSynonymTyCon isNewTyCon isPrimTyCon pprFundeps classTvsFds classSCThetaclassATs classMethodsConLike RealDataCon dataConTyCondataConFieldLabelspprLExprpprExpr pprSplice pprSpliceDecl pprPatBind pprFunBindHsExprXExprHsWrap HsTickPragma HsBinTickHsTickHsStaticHsProc HsSpliceEHsTcBracketOutHsRnBracketOut HsCoreAnnHsSCCArithSeq ExprWithTySig RecordUpd RecordCon ExplicitListHsDoHsLet HsMultiIfHsIfHsCase ExplicitSum ExplicitTupleSectionRSectionLHsParNegAppOpApp HsAppTypeHsApp HsLamCaseHsLamHsIPVar HsOverLabelHsRecFld HsConLikeOut HsUnboundVarHsVar rupd_flds rupd_exprrupd_ext rcon_fldsrcon_ext rcon_con_nameHsCmdXCmd HsCmdWrapHsCmdDoHsCmdLetHsCmdIf HsCmdCaseHsCmdParHsCmdLamHsCmdApp HsCmdArrApp HsCmdArrFormHsSpliceXSplice HsSplicedT HsSpliced HsQuasiQuote HsTypedSpliceHsUntypedSplice MatchGroupMG XMatchGroup mg_originmg_extmg_altsGRHSsXGRHSsgrhssLocalBindsgrhssExt grhssGRHSs SyntaxExpr syn_res_wrapsyn_expr syn_arg_wrapsLHsExpr GHC.Hs.ImpExp pprImpExpreplaceLWrappedNamereplaceWrappedNameieLWrappedNamelieWrappedName ieWrappedNameieNamesieNamesimpleImportDeclisImportDeclQualifiedimportDeclQualifiedStyle LImportDeclImportDeclQualifiedStyle QualifiedPre QualifiedPost ImportDecl XImportDecl ideclHidingideclAs ideclImplicitideclQualified ideclSafe ideclSource ideclPkgQual ideclNameideclExtideclSourceSrc IEWrappedNameIETypeIEName IEPatternLIEWrappedNameLIEIEXIE IEDocNamedIEDocIEGroupIEModuleContents IEThingWith IEThingAllIEVar IEThingAbs IEWildcard NoIEWildcardPatXPatCoPatSigPat NPlusKPatNPatLitPat SplicePatViewPat ConPatOutConPatInSumPatTuplePatListPatBangPatParPatAsPatLazyPatWildPatVarPatpat_wrappat_args pat_binds pat_dictspat_tvspat_con pat_arg_tysLPatGHC.Hs.ExtensionnoExtCon noExtField NoExtFieldNoExtConGhcPassPass TypecheckedParsedRenamedGhcPsGhcRnGhcTcGhcTcIdXRecIdPLIdPNoGhcTc NoGhcTcPass XHsValBindsXEmptyLocalBindsXXHsLocalBindsLRForallXHsLocalBindsLR XValBinds XXValBindsLRForallXValBindsLRXFunBindXPatBindXVarBind XAbsBinds XXHsBindsLRForallXHsBindsLRXABE XXABExportForallXABExportXPSB XXPatSynBindForallXPatSynBindXIPBinds XXHsIPBindsForallXHsIPBindsXCIPBindXXIPBind ForallXIPBindXTypeSig XPatSynSig XClassOpSigXIdSigXFixSig XInlineSigXSpecSig XSpecInstSig XMinimalSig XSCCFunSigXCompleteMatchSigXXSig ForallXSig XXFixitySigForallXFixitySigXXStandaloneKindSigXTyClDXInstDXDerivDXValDXSigD XKindSigDXDefDXForD XWarningDXAnnDXRuleDXSpliceDXDocD XRoleAnnotDXXHsDecl ForallXHsDecl XCHsGroup XXHsGroupForallXHsGroup XXSpliceDeclForallXSpliceDeclXFamDeclXSynDecl XDataDecl XClassDecl XXTyClDeclForallXTyClDecl XCTyClGroup XXTyClGroupForallXTyClGroupXNoSig XCKindSig XTyVarSigXXFamilyResultSigForallXFamilyResultSig XCFamilyDecl XXFamilyDeclForallXFamilyDecl XCHsDataDefn XXHsDataDefnForallXHsDataDefnXCHsDerivingClauseXXHsDerivingClauseForallXHsDerivingClause XConDeclGADT XConDeclH98 XXConDeclForallXConDeclXCFamEqnXXFamEqn ForallXFamEqn XCClsInstDecl XXClsInstDeclForallXClsInstDecl XClsInstD XDataFamInstD XTyFamInstD XXInstDeclForallXInstDecl XCDerivDecl XXDerivDeclForallXDerivDecl XViaStrategy XCDefaultDecl XXDefaultDeclForallXDefaultDeclXForeignImportXForeignExport XXForeignDeclForallXForeignDecl XCRuleDecls XXRuleDeclsForallXRuleDeclsXHsRule XXRuleDeclForallXRuleDecl XCRuleBndr XRuleBndrSig XXRuleBndrForallXRuleBndr XWarnings XXWarnDeclsForallXWarnDeclsXWarning XXWarnDeclForallXWarnDecl XHsAnnotation XXAnnDeclForallXAnnDeclXCRoleAnnotDeclXXRoleAnnotDeclForallXRoleAnnotDeclXVar XUnboundVar XConLikeOutXRecFld XOverLabelXIPVar XOverLitEXLitEXLamXLamCaseXApp XAppTypeEXOpAppXNegAppXPar XSectionL XSectionRXExplicitTuple XExplicitSumXCaseXIfXMultiIfXLetXDo XExplicitList XRecordCon XRecordUpdXExprWithTySig XArithSeqXSCCXCoreAnn XRnBracketOut XTcBracketOutXSpliceEXProcXStaticXTickXBinTick XTickPragmaXWrapXXExpr ForallXExpr XUnambiguous XAmbiguousXXAmbiguousFieldOccForallXAmbiguousFieldOccXPresentXMissingXXTupArg ForallXTupArg XTypedSpliceXUntypedSplice XQuasiQuoteXSplicedXXSplice ForallXSpliceXExpBrXPatBrXDecBrLXDecBrGXTypBrXVarBrXTExpBr XXBracketForallXBracketXXCmdTop ForallXCmdTopXMG XXMatchGroupForallXMatchGroupXCMatchXXMatch ForallXMatchXCGRHSsXXGRHSs ForallXGRHSsXCGRHSXXGRHS ForallXGRHS XLastStmt XBindStmtXApplicativeStmt XBodyStmtXLetStmtXParStmt XTransStmtXRecStmtXXStmtLR ForallXStmtLR XCmdArrApp XCmdArrFormXCmdAppXCmdLamXCmdParXCmdCaseXCmdIfXCmdLetXCmdDoXCmdWrapXXCmd ForallXCmdXXParStmtBlockForallXParStmtBlockXApplicativeArgOneXApplicativeArgManyXXApplicativeArgForallXApplicativeArgXHsChar XHsCharPrim XHsString XHsStringPrimXHsInt XHsIntPrim XHsWordPrim XHsInt64Prim XHsWord64Prim XHsIntegerXHsRat XHsFloatPrim XHsDoublePrimXXLit ForallXHsLit XXOverLitForallXOverLitXWildPatXVarPatXLazyPatXAsPatXParPatXBangPatXListPat XTuplePatXSumPatXConPatXViewPat XSplicePatXLitPatXNPat XNPlusKPatXSigPatXCoPatXXPat ForallXPatXHsQTvs XXLHsQTyVarsForallXLHsQTyVarsXHsIBXXHsImplicitBndrsForallXHsImplicitBndrsXHsWCXXHsWildCardBndrsForallXHsWildCardBndrs XForAllTyXQualTyXTyVarXAppTy XAppKindTyXFunTyXListTyXTupleTyXSumTyXOpTyXParTy XIParamTyXStarTyXKindSig XSpliceTyXDocTyXBangTyXRecTyXExplicitListTyXExplicitTupleTyXTyLit XWildCardTyXXType ForallXType XUserTyVar XKindedTyVar XXTyVarBndrForallXTyVarBndrXXConDeclFieldForallXConDeclField XCFieldOcc XXFieldOccForallXFieldOcc XCImportDecl XXImportDeclForallXImportDeclXIEVar XIEThingAbs XIEThingAll XIEThingWithXIEModuleContentsXIEGroupXIEDoc XIEDocNamedXXIE ForallXIE Convertableconvert ConvertIdX OutputableXOutputableBndrIdGHC.Hs.PlaceHolderplaceHolderNamesTc NameOrRdrNameVar isExportedId isGlobalId isLocalIdTyVar ForallVisFlag ForallVis ForallInvisLexermkPStateToken ParseResultPOkPFailedPunP ApiAnnotation unicodeAnngetAndRemoveAnnotationCommentsgetAnnotationCommentsgetAndRemoveAnnotation getAnnotationApiAnns AnnKeywordId AnnEofPosAnnRarrowtailUAnnLarrowtailUAnnrarrowtailUAnnlarrowtailUAnnVia AnnValStr AnnThTyQuoteAnnThIdTySplice AnnThIdSplice AnnSignatureAnnSimpleQuote AnnRarrowUAnnOpenS AnnOpenPTE AnnOpenPE AnnOpenEQUAnnOpenC AnnOpenBUAnnNameAnnMdo AnnLarrowU AnnForallU AnnDcolonU AnnDarrowU AnnCommaTuple AnnCloseS AnnCloseQU AnnCloseC AnnCloseBU AnnAnyclassAnnColon AnnStaticAnnProc AnnCloseQ AnnOpenEQAnnOpenEAnnMinusAnnDoAnnInAnnElseAnnIfAnnOfAnnCaseAnnLam AnnCloseBAnnOpenB AnnRarrowtail AnnLarrowtail Annrarrowtail AnnlarrowtailAnnRecAnnLetAnnUsingAnnGroupAnnByAnnThenAnnClass AnnClosePAnnOpenP AnnFamilyAnnData AnnNewtypeAnnStock AnnDeriving AnnExport AnnForeignAnnRoleAnnAtAnnFunIdAnnWhere AnnLarrowAnnEqualAnnVbar AnnInstanceAnnInfix AnnDefaultAnnUnitAnnBang AnnRarrow AnnDarrowAnnDot AnnForall AnnDcolonAnnSemi AnnHidingAnnAsAnnPackageName AnnQualifiedAnnSafe AnnImport AnnModuleAnnComma AnnDotdot AnnPatternAnnTilde AnnBackquoteAnnTypeAnnVal AnnHeaderAnnOpenAnnCloseAnnotationCommentAnnBlockCommentAnnLineComment AnnDocOptions AnnDocSectionAnnDocCommentNamedAnnDocCommentNextAnnDocCommentPrevRdrNameUnqualQual GHC.Hs.DocemptyArgDocMapemptyDeclDocMap concatDocs appendDocs ppr_mbDochsDocStringToByteString unpackHDSmkHsDocStringUtf8ByteString mkHsDocString HsDocString LHsDocString DeclDocMap ArgDocMapName nameModuleisExternalName nameSrcSpan NamedThing getOccNamegetNameTyCoRepTyThingACoAxiomATyConAnIdAConLikePredTypeKind ThetaTypeErrUtilsprettyPrintGhcErrorsDynFlagsaddWay'xFlagsxoptgoptdefaultObjectTarget WarnReasonNoReasonSafeHaskellMode Sf_IgnoreSf_SafeInferredSf_SafeSf_TrustworthySf_None Sf_Unsafe HscTarget HscNothingHscInterpretedHscLlvmHscCHscAsmGhcModeMkDependOneShot CompManagerGhcLink LinkStaticLib LinkDynLib LinkInMemoryNoLink LinkBinaryWayWayDyn WayEventLogWayProfWayDebug WayCustom WayThreadedFlagSpecflagSpecGhcModeflagSpecAction flagSpecName flagSpecFlag DriverPhases HscSource HsSrcFilePhaseCppModule pprModulemkModule mkModuleNamemoduleNameString ModLocation ml_hie_file ml_obj_file ml_hs_file ml_hi_file isFunTyCon tyConTyVars tyConKind tyConArity BasicTypesfailed succeeded compareFixity negateFixity defaultFixity maxPrecedenceFixityFixityDirectionInfixNInfixLInfixR LexicalFixityPrefixInfix SuccessFlag SucceededFailedSpliceExplicitFlagExplicitSpliceImplicitSpliceSeveritySevError SevWarningSevInfoSevDumpSevInteractive SevOutputSevFatalSrcLoc unRealSrcSpangetRealSrcSpancLdL isSubspanOfspansleftmost_largestleftmost_smallest rightmost cmpLocated eqLocatedaddCLoc combineLocsmkGeneralLocatednoLocgetLocunLoc srcSpanEnd srcSpanStart srcSpanEndColsrcSpanStartColsrcSpanEndLinesrcSpanStartLine isGoodSrcSpan mkSrcSpan srcLocSpan noSrcSpan srcLocCol srcLocLine srcLocFilenoSrcLoc mkRealSrcLocmkSrcLoc RealSrcLoc UnhelpfulLoc RealSrcSpan srcSpanFileSrcSpan UnhelpfulSpan GenLocatedLLocated SrcSpanLess HasSrcSpancomposeSrcSpandecomposeSrcSpan OutputablevcatshowSDoc withPprStyle alwaysQualifyPprStylePrintUnqualifiedppr moduleName moduleUnitIdUnitId StringBufferstringToStringBuffer FastStringfsLitPanicwithSignalHandlersPprProgramError ProgramErrorInstallationErrorPprSorrySorryPprPanic CmdLineError UsageErrorSignalSDoc cfgWeightInfouniqueIncrement initialUnique maxErrors reverseErrorsmaxInlineMemsetInsnsmaxInlineMemcpyInsnsmaxInlineAllocSizertccInfortldInfoavx512pfavx512favx512eravx512cdavx2avx bmiVersion sseVersionnextWrapperNuminteractivePrintprofAuto colScheme canUseColoruseColor ghciScriptshaddockOptionsghcVersionFileflushErrflushOut log_action ghciHistSize maxWorkerArgsufVeryAggressiveufDearOpufKeenessFactorufDictDiscountufFunAppDiscountufUseThresholdufCreationThresholdextensionFlags extensionstrustworthyOnLocwarnUnsafeOnLoc warnSafeOnLoc pkgTrustOnLocincoherentOnLocoverlapInstLoc newDerivOnLocthOnLoc safeInferred safeInfer safeHaskelllanguagefatalWarningFlags warningFlags generalFlags dumpFlagsgeneratedDumpsnextTempSuffix dirsToClean filesToCleanpkgState pkgDatabase packageEnv trustFlagspluginPackageFlags packageFlagsignorePackageFlagspackageDBFlags depSuffixesdepExcludeModsdepIncludeCppDepsdepIncludePkgDeps depMakefilehooks staticPlugins cachedPluginsfrontendPluginOptspluginModNameOptspluginModNameshpcDirrtsOptsSuggestionsrtsOptsEnabledrtsOptscmdlineFrameworksframeworkPaths libraryPaths includePathsldInputsdumpPrefixForce dumpPrefix dynLibLoaderoutputHi dynOutputFile outputFiledynHiSuf dynObjectSufcanGenerateDynamicToohieSufhiSufhcSuf objectSufdumpDirstubDirhieDirhiDirdylibInstallName objectDir splitInfobuildTagwaysthisUnitIdInsts_thisComponentId_thisInstalledUnitIdsolverIterationsreductionDepth mainFunIs mainModIs importPaths historySizecmmProcAlignment liftLamsKnownliftLamsNonRecArgsliftLamsRecArgs floatLamArgsliberateCaseThresholdbinBlobThresholdspecConstrRecursivespecConstrCountspecConstrThresholdsimplTickFactormaxPmCheckModelsmaxUncoveredPatternsrefLevelHoleFitsmaxRefHoleFitsmaxValidHoleFitsmaxRelevantBinds ghcHeapSizeenableTimeStats parMakeCountstrictnessBefore inlineCheck ruleCheckmaxSimplIterations simplPhases debugLeveloptLevel verbosity llvmConfigintegerLibrary rawSettingsplatformConstants platformMisc toolSettings fileSettingsghcNameVersion hscTargetghcLinkghcModetargetPlatform pprUserLength useUnicodepprCols GeneralFlagOpt_G_NoOptCoercionOpt_G_NoStateHackOpt_PluginTrustworthyOpt_PackageTrustOpt_DistrustAllPackagesOpt_BuildDynamicTooOpt_KeepOFilesOpt_KeepHiFilesOpt_KeepLlvmFilesOpt_KeepRawTokenStreamOpt_KeepTmpFilesOpt_KeepSFilesOpt_KeepHcFilesOpt_KeepHiDiffsOpt_KeepHscppFilesOpt_ImplicitImportQualifiedOpt_AutoLinkPackagesOpt_SuppressTimestampsOpt_SuppressTicksOpt_SuppressStgExtsOpt_SuppressUniquesOpt_SuppressTypeSignaturesOpt_SuppressUnfoldingsOpt_SuppressIdInfoOpt_SuppressTypeApplicationsOpt_SuppressModulePrefixesOpt_SuppressVarKindsOpt_SuppressCoercionsOpt_HexWordLiteralsOpt_ShowLoadedModulesOpt_ShowMatchesOfHoleFitsOpt_ShowProvOfHoleFitsOpt_ShowTypeOfHoleFitsOpt_ShowDocsOfHoleFitsOpt_ShowTypeAppVarsOfHoleFitsOpt_ShowTypeAppOfHoleFitsOpt_UnclutterValidHoleFitsOpt_AbstractRefHoleFitsOpt_SortBySubsumHoleFitsOpt_SortBySizeHoleFitsOpt_SortValidHoleFitsOpt_ShowValidHoleFitsOpt_ShowHoleConstraintsOpt_PprShowTicksOpt_PprCaseAsLetOpt_DiagnosticsShowCaretOpt_DeferDiagnosticsOpt_ErrorSpansOpt_ByteCodeIfUnboxed Opt_KeepGoing Opt_KeepCAFsOpt_SingleLibFolderOpt_WholeArchiveHsLibsOpt_VersionMacrosOpt_OptimalApplicativeDoOpt_ExternalInterpreter Opt_FlatCacheOpt_HpcOpt_RelativeDynlibPaths Opt_RPathOpt_Ticky_Dyn_Thunk Opt_Ticky_LNEOpt_Ticky_Allocd Opt_TickyOpt_SccProfilingOnOpt_ExternalDynamicRefsOpt_PICExecutableOpt_PIEOpt_PICOpt_DeferOutOfScopeVariablesOpt_DeferTypedHolesOpt_DeferTypeErrorsOpt_HelpfulErrorsOpt_NoItOpt_LocalGhciHistoryOpt_ValidateHieOpt_GhciLeakCheckOpt_GhciHistoryOpt_GhciSandboxOpt_IgnoreDotGhciOpt_BuildingCabalPackageOpt_SharedImplibOpt_EmbedManifestOpt_GenManifestOpt_PrintBindContentsOpt_PrintEvldWithShowOpt_BreakOnErrorOpt_BreakOnExceptionOpt_HaddockOptions Opt_HaddockOpt_PrintBindResultOpt_HideAllPluginPackagesOpt_HideAllPackages Opt_StgStatsOpt_SplitSections Opt_NoHsMainOpt_EagerBlackHolingOpt_ExcessPrecisionOpt_IgnoreHpcChangesOpt_IgnoreOptimChangesOpt_ForceRecompOpt_PpOpt_ProfCountEntriesOpt_AutoSccsOnIndividualCafs Opt_WriteHieOpt_WriteInterfaceOpt_ExposeAllUnfoldingsOpt_OmitInterfacePragmasOpt_IgnoreInterfacePragmasOpt_SimplPreInliningOpt_NumConstantFoldingOpt_CatchBottomsOpt_AlignmentSanitisationOpt_SolveConstantDictsOpt_WorkerWrapper Opt_CprAnalOpt_WeightlessBlocklayoutOpt_CfgBlocklayoutOpt_LoopificationOpt_DmdTxDictSelOpt_DictsStrictOpt_FunToThunkOpt_OmitYieldsOpt_AsmShortcuttingOpt_CmmElimCommonBlocks Opt_CmmSinkOpt_IrrefutableTuplesOpt_LlvmFillUndefWithGarbage Opt_LlvmTBAAOpt_PedanticBottomsOpt_RegsIterative Opt_RegsGraphOpt_EnableThSpliceWarningsOpt_EnableRewriteRulesOpt_DictsCheapOpt_UnboxSmallStrictFieldsOpt_UnboxStrictFieldsOpt_CaseFolding Opt_CaseMergeOpt_DoEtaReductionOpt_IgnoreAssertsOpt_DoLambdaEtaExpansionOpt_SpecConstrKeenOpt_SpecConstrOpt_LiberateCaseOpt_StgLiftLams Opt_StgCSEOpt_CSE Opt_StaticArgumentTransformationOpt_CrossModuleSpecialiseOpt_SpecialiseAggressivelyOpt_SpecialiseOpt_LateSpecialise Opt_FloatInOpt_FullLazinessOpt_KillOneShotOpt_KillAbsenceOpt_LateDmdAnalOpt_StrictnessOpt_Exitification Opt_CallArityOpt_PrintTypecheckerElaborationOpt_PrintPotentialInstancesOpt_PrintExpandedSynonymsOpt_PrintUnicodeSyntaxOpt_PrintAxiomIncompsOpt_PrintEqualityRelationsOpt_PrintExplicitRuntimeRepsOpt_PrintExplicitCoercionsOpt_PrintExplicitKindsOpt_PrintExplicitForallsOpt_HideSourcePathsOpt_ShowWarnGroupsOpt_WarnIsErrorOpt_NoTypeableBinds Opt_FastLlvmOpt_NoLlvmManglerOpt_DoAnnotationLintingOpt_DoAsmLintingOpt_DoCmmLintingOpt_DoStgLintingOpt_DoCoreLintingOpt_D_dump_minimal_importsOpt_DumpToFileOpt_D_faststring_stats Exceptiongfinallygcatchgbracket ghci-8.10.7GHCi.RemoteTypes ForeignHValueHValue coreModule SDocContext ParserOpts UnitStateLoggerMessage dynamicGhc initLogger putLogMsg pushLogHook modifyLogger mkLogActionemptyUnitStateshowSDocForUser mkParserOptsinitParserStategetErrorMessagespprErrorMessagesdefaultSDocContextshowGhcExceptionaddWaysetBackendToInterpreterparseDynamicFlagspprTypeForUser errMsgSpan fileTarget guessTarget PhantomModulepmNamepmFile SessionData internalStateversionSpecific ghcErrListRef ghcLoggerRunGhcInterpreterSessionInterpreterConfigurationConfsearchFilePath languageExtsallModsInScopeInterpreterStateStactivePhantomszombiePhantomsphantomDirectoryhintSupportModuleimportQualHackMod qualImports defaultExts configurationcatchIE fromStateonStatemayFaildebugshowGHCmoduleIsLoaded withDynFlags typeToString kindToStringmoduleToString isSucceeded ParseErrorParseOk runParserfailOnParseErrorExpr safeBndFor partitionpartitionEitherquote setGhcOptions setGhcOption defaultConfconfigureDynFlagscleanPhantomModules supportString supportShowrunInterpreterWithArgsrunInterpreterWithArgsLibdirbaseGHC.ShowShowghc-prim GHC.TypesIOControl.Monad.IO.ClassMonadIOliftIOtransformers-0.5.6.2Control.Monad.Trans.Class MonadTranslift