!"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~NoneNoneNone      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklNonemnopqrstuvwxyz{|}~mnopqrstuvwxyz{|}~mnopqrstuvwxyz{|}~None6This represents language extensions beyond Haskell 98 0 that are supported by GHC (it was taken from  Cabal's Language.Haskell.Extension) J1List of the extensions known by the interpreter. M  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLM  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLIIHGFEDCBA@?>=<;:9876543210/.-,+*)('&%$#"!  JKLNoneM  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMIHGFEDCBA@?>=<;:9876543210/.-,+*)('&%$#"!  LJK NoneM"Module names are _not_ filepaths. R5GhcExceptions from the underlying GHC API are caught  and rethrown as this. Z/Version of the underlying ghc api. Values are:  606 for GHC 6.6.x  608 for GHC 6.8.x  610 for GHC 6.10.x  etc... >MNOPQRSTUVWXYZ3MNOPQRSTUVWXYZ!MNOPQUTSRVWXYZ None[9Get the annotations associated with a particular module. For example, given:    RBRACE-# ANN module (1 :: Int) #-LBRACE ! module SomeModule(g, h) where  ... Then after using  loadModule to load SomeModule into scope:   x <#- getModuleAnnotations (as :: Int)  SomeModule  liftIO $ print x  -- result is [1] \:Get the annotations associated with a particular function For example, given:   ! module SomeModule(g, h) where  LBRACE-# ANN g (Just 1 :: Maybe Int) #-RBRACE  g = f [f]  LBRACE-# ANN h (Just 2 :: Maybe Int) #-RBRACE  h = f Then after using  loadModule! to bring SomeModule into scope:    x <=- liftM concat $ mapM (getValAnnotations (as :: Maybe Int)) ["g","h"]  liftIO $ print x  -- result is [Just 2, Just 1] DThis can also work on data constructors and types with annotations. [\[\[\ None_Available options are:  b  d  e `BUse this function to set or modify the value of any option. It is  invoked like this: 0set [opt1 := val1, opt2 := val2,... optk := valk]a"Retrieves the value of an option. b/Language extensions in use by the interpreter.  Default is: [] (i.e. none, pure Haskell 98) c&List of extensions turned on when the -fglasgow-exts flag is used d When set to True8, 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. <Observe that due to limitations in the GHC-API, when set to False, the @ private symbols in interpreted modules will not be in scope. eEThe search path for source files. Observe that every time it is set, 9 it overrides the previous search path. The default is ["."]. *Keep in mind that by a limitation in ghc, "." is always in scope. ]^_`abcdefg[  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJ]^_`abcdefg]^_`abcdefgNonelJAn Id for a class, a type constructor, a data constructor, a binding, etc oLGets an abstract representation of all the entities exported by the module.  It is similar to the :browse command in GHCi. hijklmnohijklmnohkjilmnoNone@Conversions from GHC representation to standard representations Nonep@Tries to load all the requested modules from their source file. 5 Modules my be indicated by their ModuleName (e.g. " My.Module") or ( by the full path to its source file. The interpreter is v2 both before loading the modules and in the event  of an error. q,Returns True if the module was interpreted. r(Returns the list of modules loaded with p. sGSets the modules whose context is used during evaluation. All bindings ; of these modules are in scope, not only those exported. 2Modules must be interpreted to use this function. t3Sets the modules whose exports must be in context.  Warning: t and u are mutually exclusive. G If you have a list of modules to be used qualified and another list 3 unqualified, then you need to do something like A setImportsQ ((zip unqualified $ repeat Nothing) ++ qualifieds) u8Sets the modules whose exports must be in context; some # of them may be qualified. E.g.:  setImports [(Prelude , Nothing), (Data.Map, Just M)]. Here, map will refer to Prelude.map and M.map to Data.Map.map.  works like v, but skips the / loading of the support module that installs _show. Its purpose E is to clean up all temporary files generated for phantom modules. v7All imported modules are cleared from the context, and 3 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. pqrstuvMpqrstuvpqrstuvNonew@The installed version of ghc is not thread-safe. This exception ) is thrown whenever you try to execute runInterpreter while another  instance is already running. {"Executes the interpreter. Returns Left InterpreterError in case of error. >NB. The underlying ghc will overwrite certain signal handlers Q (SIGINT, SIGHUP, SIGTERM, SIGQUIT on Posix systems, Ctrl-C handler on Windows). C In future versions of hint, this might be controlled by the user. @Executes the interpreter, setting args passed in as though they ! were command-line args. Returns Left InterpreterError in case of  error. wxyz{wxyz{wxyz{None|*Set a GHC option for the current session,  eg. unsafeSetGhcOption "-XNoMonomorphismRestriction". ?Warning: Some options may interact badly with the Interpreter. }?Executes the interpreter, setting the args as though they were C 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. |}|}|}|}None|}NoneNoneNone~?Returns a string representation of the type of the expression. %Tests if the expression type checks. DReturns a string representation of the kind of the type expression. ~~~None&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)&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)CEvaluates an expression, given a witness for its monomorphic type.  eval expr will evaluate  show expr.  It will succeed only if expr has type t and there is a   instance for t. Conceptually,  parens s = "(" ++ s ++ ")", where s is any valid haskell 2 expression. In practice, it is harder than this.  Observe that if s$ ends with a trailing comment, then parens s would H be a malformed expression. The straightforward solution for this is to F 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:  parens s = " (let {foo =n" ++ s ++ "\ n ;} in foo)" where foo does not occur in s non-portable (GHC API) experimentaljcpetruzza@gmail.comNone  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{~VWXYyz{_]^a`bJcIHGFEDCBA@?>=<;:9876543210/.-,+*)('&%$#"!  defgMqprstuvhkjilmno[\~QUTSRNOPwxZNone  !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{~ !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcd e f f g h i j k l m n o p q r s t u v w x y z { | } ~p      !"#$%&'()*+,+-./01020304050607089:;<;=;>;?;@;A;;;B;CDEDFGHGIGJGKGLGMGNGOGPGQGQGRGSGTGUGVGWGXGYGZG[G\G]G^G_G`GaGbGcGdGeGfGgGhGiGjGkGlGmGnGoGpGqGqGrGsGtGuGvGwGxGyGzG{G|G}G~GGGGGGGGGG      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijkklmnoopqrsttuvwxyz{|}~Q      !"#$%%&'()*+,-./0112334567859:;<=6>?@ABACDEFGHIJKLMNOPQRSTUVWXYZ[\]^]_]`]a]b]c]d]e]f]g]h]i]j]k]l]m]n]o]p]q]r]s]t]u]v]w]x]y]z]{]|]}]~]]]]]]]]]]]]]]]]]]]                          ! " # $ % & ' ( ) * + , - . / 0 1 2 3 4 5 6 7 8 9 : ; < = > ? @ A B C D E F G H I J K L M N O P Q R S T U V W X Y Z [ \ ] ^ _ ` a b c d e f g h i j k l m n o p q r s t u v w x y z { | } ~                                                                                                                                                                !"#$%&''()*+,-./01232425262728292:2;2<2=2>2?2@2A2B2C2D2E2F2G2H2I2J2K2L2M2N2N2O2P2Q2R2S2T2U2V2W2X2Y2Z2[2\2]2^2_2`2`2a2b2c2d2e2f2g2h2i2j2k2l2m2n2o2p2q2r2s2t2u2v2w2x2y2_2z2{2x2|2}2~2222222222228888888888888888888888888878888mr              ]] !"#$%&'()*+,-./012344567789:;<=>?@?A?B?C?D?E?F?G?H I J K  LMNOPQRSTSUSVSWSXSSSYSZS[S\S]S^Si_`_a_bcdee?fghgigjggklmnlmopqrst3PuvP   wxBA@ y y z { | } } ~                                         v        E hint-0.3.3.5&Language.Haskell.Interpreter.ExtensionLanguage.Haskell.Interpreter#Language.Haskell.Interpreter.UnsafeHint.SignalHandlers Hint.UtilHint.GHC Hint.CompatHint.Extension Hint.BaseHint.AnnotationsHint.Configuration System.UnsafeunsafePerformIOHint.ReflectionHint.Conversions Hint.ContextHint.InterpreterT'Language.Haskell.Interpreter.GHC.Unsafe Hint.Parsers Hint.SandboxHint.Typecheck Hint.Eval Language.Haskell.Interpreter.GHC ExtensionUnknownExtensionDeriveFoldableDeriveTraversable DeriveFunctorMonoLocalBindsDatatypeContextsExplicitForAllRebindableSyntaxDoAndIfThenElseNPlusKPatternsGHCForeignImportPrim TupleSectionsRegularPatterns XmlSyntax ViewPatternsTransformListComp QuasiQuotesPostfixOperatorsNewQualifiedOperatorsImpredicativeTypesPackageImportsConstrainedClassMethodsDeriveDataTypeable UnboxedTuplesExtendedDefaultRulesRelaxedPolyRecNoMonoPatBindsGADTsOverloadedStringsDisambiguateRecordFields RecordPunsRecordWildCards TypeOperatorsLiberalTypeSynonymsUnliftedFFITypesPatternSignatures UnicodeSyntaxStandaloneDeriving TypeFamilies MagicHash HereDocumentsRestrictedTypeSynonymsExtensibleRecordsGeneralizedNewtypeDeriving PatternGuardsNamedFieldPunsNoImplicitPreludeGenericsArrowsForeignFunctionInterfaceTemplateHaskellTypeSynonymInstances BangPatternsKindSignaturesCPPEmptyDataDeclsFlexibleInstancesFlexibleContextsImplicitParamsScopedTypeVariablesExistentialQuantificationPolymorphicComponents RankNTypes Rank2TypesFunctionalDependenciesNoMonomorphismRestrictionMultiParamTypeClassesParallelListComp RecursiveDoDoRecIncoherentInstancesUndecidableInstancesOverlappingInstancesavailableExtensions asExtensionknownExtensions ModuleNameGhcErrorerrMsgInterpreterError GhcException NotAllowed WontCompile UnknownErrorMonadInterpreter fromSessionmodifySessionRefrunGhc ghcVersiongetModuleAnnotationsgetValAnnotations OptionVal:=OptionsetgetlanguageExtensionsglasgowExtensionsinstalledModulesInScope searchPathsetUseLanguageExtensions#setInstalledModsAreInScopeQualified ModuleElemDataClassFunIdnamechildrengetModuleExports loadModulesisModuleInterpretedgetLoadedModulessetTopLevelModules setImports setImportsQresetMultipleInstancesNotAllowed InterpreterT InterpreterrunInterpreterunsafeSetGhcOptionunsafeRunInterpreterWithArgstypeOf typeCheckskindOfasinfer interpretevalparenshelpersignals saveHandlersrestoreHandlersprotectHandlersExpr safeBndFor partitionpartitionEither>=>quoteMessage ghc-7.6.1 PprTyThingpprTypeForUserGHCparser lookupNameobtainTermFromIdobtainTermFromValgetHistorySpan setGHCiMonadmoduleTrustReqsisModuleTrusted lookupModule findModuleshowRichTokenStreamaddSourceToTokensgetRichTokenStreamgetTokenStreampprParenSymName dataConTypepackageDbModulesgetGREfindGlobalAnnslookupGlobalName isDictonaryIdmodInfoModBreaks modInfoSafe modInfoIfacemodInfoLookupNamemkPrintUnqualifiedForModulemodInfoIsExportedNamemodInfoInstancesmodInfoExportsmodInfoTopLevelScopemodInfoTyThings getModuleInfogetPrintUnqualgetInsts getBindingsisLoadedneedsTemplateHaskellgetModuleGraphcompileCoreToObjcompileToCoreSimplifiedcompileToCoreModule loadModule desugarModuletypecheckModule parseModule getModSummaryworkingDirectoryChanged guessTarget removeTarget addTarget getTargets setTargetsparseDynamicFlagsgetInteractiveDynFlagssetInteractiveDynFlagsgetProgramDynFlagssetProgramDynFlagssetSessionDynFlags initGhcMonaddefaultCleanupHandlerdefaultErrorHandler parsedSource ParsedMod moduleInfotypecheckedSource renamedSourceTypecheckedMod coreModulepm_extra_src_filespm_parsed_sourcepm_mod_summary ParsedModule tm_internals_tm_checked_module_infotm_typechecked_sourcetm_renamed_sourcetm_parsed_moduleTypecheckedModuledm_core_moduledm_typechecked_moduleDesugaredModule ParsedSource RenamedSourceTypecheckedSourcecm_safecm_bindscm_types cm_module CoreModule ModuleInfoInteractiveEvalreconstructType showModuledynCompileExpr compileExprtypeKindexprType parseNamegetRdrNamesInScopegetNamesInScopegetInfomoduleIsInterpreted getContext setContext abandonAllabandonforwardbackresumeparseImportDeclrunDeclsWithLocationrunDeclsrunStmtWithLocationrunStmtgetHistoryModulegetResumeContextRunOk RunExceptionRunBreak RunResultresumeHistoryIx resumeHistory resumeSpanresumeBreakInforesumeThreadId resumeStmtRunToCompletion SingleStepRunAndLogStepshistoryEnclosingDeclshistoryBreakInfoHistoryGhcMakecyclicModuleErrtopSortModuleGraphloaddepanalLoadAllTargetsLoadUpToLoadDependenciesOf LoadHowMuch ByteCodeLinkHValueGhcMonaddefaultWarnErrLoggerprintExceptionAndWarningsprintExceptiongetSessionDynFlags setSession getSessionGhc WarnErrLoggerParser parseType parseStmtHscTypes ms_mod_namehandleSourceErrorsrcErrorMessages SourceError GhcApiErrorHscEnvtargetContentstargetAllowObjCodetargetIdTarget TargetModule TargetFileTargetId mi_trust_pkgmi_trustmi_hpc mi_hash_fn mi_fix_fn mi_warn_fn mi_vect_infomi_orphan_hashmi_rules mi_fam_instsmi_insts mi_globalsmi_declsmi_annsmi_warns mi_fixities mi_used_th mi_exp_hash mi_exports mi_usagesmi_depsmi_boot mi_finsts mi_orphan mi_flag_hash mi_mod_hash mi_iface_hash mi_moduleModIfaceIIDeclIIModuleInteractiveImport ModuleGraph ms_hspp_buf ms_hspp_opts ms_hspp_filems_textual_imps ms_srcimps ms_obj_date ms_hs_date ms_location ms_hsc_srcms_mod ModSummary BreakIndexmodBreaks_declsmodBreaks_varsmodBreaks_locsmodBreaks_flags ModBreaks ByteCodeInstrbreakInfo_numberbreakInfo_module BreakInfoLexermkPStateTokenPOkPFailed ParseResultunPPHsSynhsmodHaddockModHeaderhsmodDeprecMessage hsmodDecls hsmodImports hsmodExports hsmodNameHsModule HsExtCoreHsUtils lPatImplicitshsValBindsImplicitslStmtsImplicitshsFamInstBindershsTyClDeclBindershsLTyClDeclBindershsTyClDeclsBindershsForeignDeclsBindershsGroupBinderscollectPatsBinderscollectPatBinderscollectStmtBinderscollectLStmtBinderscollectStmtsBinderscollectLStmtsBinderscollectMethodBinderscollectHsBindListBinderscollectHsBindsBinderscollectHsBindBinderscollectHsValBinderscollectLocalBindersmkMatchmk_easy_FunBind mkVarBind mkHsVarBind mkTopFunBind mkFunBind mkHsDictLet mkHsWrapPatCo mkHsWrapPat coToHsWrapper mkLHsWrapCo mkHsWrapComkHsWrap mkLHsWrap missingTupArg nlTuplePat mkLHsVarTuplemkLHsTupleExpr nlHsTyConApp nlHsFunTy nlHsTyVar nlHsAppTynlListnlHsCasenlHsIfnlHsParnlHsLam nlHsOpAppnlHsDo nlWildPat nlWildConPatnlNullaryConPatnlConPat nlInfixConPat nlConVarPat nlHsVarAppsnlHsApps nlHsIntLitnlHsAppnlLitPatnlVarPatnlHsLitnlHsVaruserHsTyVarBndrs mkHsStringunqualQuasiQuotemkHsQuasiQuote unqualSplice mkHsSpliceTy mkHsSplice mkHsOpApp mkRecStmt emptyRecStmt mkBindStmt mkExprStmt mkLastStmtmkGroupByUsingStmtmkGroupUsingStmtmkTransformByStmtmkTransformStmtemptyTransStmt mkNPlusKPatmkNPatmkHsIfmkHsCompmkHsDonoRebindableInfo mkHsIsStringmkHsFractional mkHsIntegralmkParPatmkLHsPar nlHsTyApp mkSimpleHsAlt mkHsConAppmkHsLamsmkHsLammkHsApp mkHsAppTy mkMatchGroup unguardedRHSunguardedGRHSs mkSimpleMatchmkHsParHsExpr pprStmtInCtxtpprMatchInCtxtmatchContextErrStringpprStmtContextpprAStmtContextpprMatchContextNounpprMatchContextmatchSeparatorisMonadCompExprisListCompExpr pp_dotdot thBrackets pprHsBracketpprQualspprComp ppr_do_stmtspprDopprBy pprTransStmtpprTransformStmtpprStmtpp_rhspprGRHSpprGRHSspprMatch pprMatches hsLMatchPatsmatchGroupArityisEmptyMatchGroupisAtomicHsExprhsExprNeedsParens pprParendExprpprDebugParendExpr pprCmdArgppr_expr ppr_lexprpprBinds isQuietHsExpr tupArgPresent noSyntaxTable noSyntaxExpr noPostTcTable noPostTcExpr PostTcExpr PostTcTable SyntaxTableHsVarHsIPVar HsOverLitHsLitHsLam HsLamCaseHsAppOpAppNegAppHsParSectionLSectionR ExplicitTupleHsCaseHsIf HsMultiIfHsLetHsDo ExplicitList ExplicitPArr RecordCon RecordUpd ExprWithTySigExprWithTySigOutArithSeqPArrSeqHsSCC HsCoreAnn HsBracket HsBracketOut HsSpliceE HsQuasiQuoteEHsProcHsArrApp HsArrFormHsTick HsBinTick HsTickPragmaEWildPatEAsPatEViewPatELazyPatHsTypeHsWrapPresentMissingHsTupArg PendingSpliceHsCmdLHsCmdHsHigherOrderAppHsFirstOrderApp HsArrAppType LHsCmdTopHsCmdTop HsRecordBinds MatchGroupLMatchMatchgrhssLocalBinds grhssGRHSsGRHSsLGRHSGRHSLStmtLStmtLRStmtLastStmtBindStmtExprStmtLetStmtParStmttrS_fmaptrS_bindtrS_rettrS_by trS_using trS_bndrs trS_stmtstrS_form TransStmt recS_ret_ty recS_rec_retsrecS_later_rets recS_mfix_fn recS_ret_fn recS_bind_fn recS_rec_idsrecS_later_ids recS_stmtsRecStmtStmtLRThenForm GroupForm TransForm ParStmtBlockHsSpliceExpBrPatBrDecBrLDecBrGTypBrVarBrFromFromThenFromTo FromThenTo ArithSeqInfoFunRhs LambdaExprCaseAltIfAltProcExpr PatBindRhsRecUpdStmtCtxt ThPatQuoteHsMatchContextListComp MonadCompPArrCompDoExprMDoExpr ArrowExprGhciStmtPatGuard ParStmtCtxt TransStmtCtxt HsStmtContextHsDeclsmodifyAnnProvenanceNameMannProvenanceName_maybe docDeclDoc lvectInstDecl lvectDeclNamecollectRuleBndrSigTysnoForeignExportCoercionYetnoForeignImportCoercionYetinstDeclFamInstshsConDeclArgTyspprTyClDeclFlavourpprTyDefnFlavourcountTyClDeclstcdNamefamInstDeclName isFamilyDecl isClassDecl isSynDecl isDataDecl isHsSynDefn isHsDataDefn appendGroups emptyRnGroup emptyRdrGroupLHsDeclTyClDInstDDerivDValDSigDDefDForDWarningDAnnDRuleDVectDSpliceDDocD QuasiQuoteDHsDeclhs_docshs_vects hs_ruledshs_annds hs_warndshs_fordshs_defdshs_fixds hs_derivds hs_instds hs_tycldshs_valdsHsGroup SpliceDecl LTyClDecl TyClGroup tcdExtNametcdLName ForeignType tcdKindSig tcdTyVars tcdFlavourTyFamilytcdFVs tcdTyDefnTyDecltcdDocs tcdATDefstcdATstcdMethstcdSigstcdFDstcdCtxt ClassDeclTyClDecl td_synRhs TySynonym td_derivstd_cons td_kindSigtd_cTypetd_ctxttd_NDTyDataHsTyDefnNewTypeDataType NewOrData TypeFamily DataFamily FamilyFlavourLConDecl con_old_reccon_doccon_res con_detailscon_cxt con_qvars con_explicitcon_nameConDeclHsConDeclDetailsResTyH98 ResTyGADTResType LFamInstDeclfid_fvsfid_defnfid_pats fid_tycon FamInstDecl LInstDecl cid_fam_instscid_sigs cid_binds cid_poly_tyClsInstDlid_instFamInstDInstDecl LDerivDecl deriv_type DerivDecl LDefaultDecl DefaultDecl LForeignDecl ForeignImport ForeignExport ForeignDeclCImportCLabel CFunctionCWrapper CImportSpecCExport LRuleDeclHsRuleRuleDeclRuleBndr RuleBndrSig LVectDeclHsVectHsNoVect HsVectTypeIn HsVectTypeOut HsVectClassInHsVectClassOut HsVectInstIn HsVectInstOutVectDeclLDocDeclDocCommentNextDocCommentPrevDocCommentNamedDocGroupDocDecl LWarnDeclWarningWarnDeclLAnnDecl HsAnnotationAnnDeclValueAnnProvenanceTypeAnnProvenanceModuleAnnProvenance AnnProvenanceHsPathsPatNeedsParensisIrrefutableHsPatisLiftedPatBind isBangHsBind isBangLPat mkCharLitPatmkNilPatmkPrefixConPat pprParendLPat hsRecFields hsConPatArgsInPatOutPatWildPatVarPatLazyPatAsPatParPatBangPatListPatTuplePatPArrPatConPatInpat_typat_args pat_binds pat_dictspat_tvspat_con ConPatOutViewPat QuasiQuotePatLitPatNPat NPlusKPatSigPatIn SigPatOutCoPat PrefixConRecConInfixCon HsConDetailsHsConPatDetails rec_dotdotrec_flds HsRecFieldshsRecPun hsRecFieldArg hsRecFieldId HsRecFieldHsBindspprTcSpecPragspprSpec pprVarSig pragBracketsppr_sig overlapHsSighsSigDoc isInlineLSig isPragLSigisSpecInstLSig isSpecLSig isTypeLSig isVanillaLSig isFixityLSigisDefaultMethod hasSpecPrags noSpecPragsisEmptyIPBindspprTicks ppr_monobindgetTypeSigNamesplusHsValBindsisEmptyLHsBinds emptyLHsBindsemptyValBindsOutemptyValBindsInisEmptyValBindsisEmptyLocalBindsemptyLocalBinds pprDeclListpprLHsBindsForUser pprLHsBindsplaceHolderNames HsLocalBinds HsValBinds HsIPBindsEmptyLocalBindsHsLocalBindsLR ValBindsIn ValBindsOut HsValBindsLRLHsBindLHsBindsHsBind LHsBindsLR LHsBindLRfun_tickbind_fvs fun_co_fn fun_matches fun_infixfun_idFunBind pat_ticks pat_rhs_typat_rhspat_lhsPatBind var_inlinevar_rhsvar_idVarBind abs_binds abs_ev_binds abs_exports abs_ev_varsabs_tvsAbsBindsHsBindLR abe_pragsabe_wrapabe_monoabe_polyABEABExportIPBindsLIPBindIPBindLSigTypeSig GenericSigIdSigFixSig InlineSigSpecSig SpecInstSigSig LFixitySig FixitySigIsDefaultMethod SpecPrags TcSpecPrags LTcSpecPragSpecPrag TcSpecPrag FamInstEnv pprFamInstHdr pprFamInstInstEnvpprInstanceHdr pprInstanceinstanceDFunIdClsInst isBottomingId isDeadBinder isImplicitId idDataConisDataConWorkId isFCallId isPrimOpIdisClassOpId_maybeisRecordSelectorrecordSelectorFieldLabelidTypeDataCondataConUserType dataConSigdataConStrictMarksdataConFieldLabelsdataConIsInfix dataConTyConErrUtilsprettyPrintGhcErrorsDynFlagsxFlagssupportedLanguagesAndExtensionsxoptdoptdefaultObjectTargetOpt_D_dump_cmmOpt_D_dump_raw_cmmOpt_D_dump_cmmzOpt_D_dump_cmmz_cfgOpt_D_dump_cmmz_cbeOpt_D_dump_cmmz_procOpt_D_dump_cmmz_spillsOpt_D_dump_cmmz_rewriteOpt_D_dump_cmmz_deadOpt_D_dump_cmmz_stubOpt_D_dump_cmmz_spOpt_D_dump_cmmz_procmapOpt_D_dump_cmmz_splitOpt_D_dump_cmmz_lowerOpt_D_dump_cmmz_infoOpt_D_dump_cmmz_cafsOpt_D_dump_cps_cmmOpt_D_dump_cvt_cmmOpt_D_dump_asmOpt_D_dump_asm_nativeOpt_D_dump_asm_livenessOpt_D_dump_asm_coalesceOpt_D_dump_asm_regallocOpt_D_dump_asm_regalloc_stagesOpt_D_dump_asm_conflictsOpt_D_dump_asm_statsOpt_D_dump_asm_expandedOpt_D_dump_llvmOpt_D_dump_core_statsOpt_D_dump_cpranalOpt_D_dump_deriv Opt_D_dump_dsOpt_D_dump_flatCOpt_D_dump_foreignOpt_D_dump_inliningsOpt_D_dump_rule_firingsOpt_D_dump_rule_rewritesOpt_D_dump_occur_analOpt_D_dump_parsed Opt_D_dump_rnOpt_D_dump_core_pipelineOpt_D_dump_simplOpt_D_dump_simpl_iterationsOpt_D_dump_simpl_phasesOpt_D_dump_specOpt_D_dump_prepOpt_D_dump_stgOpt_D_dump_stranal Opt_D_dump_tcOpt_D_dump_typesOpt_D_dump_rulesOpt_D_dump_cseOpt_D_dump_worker_wrapperOpt_D_dump_rn_traceOpt_D_dump_rn_statsOpt_D_dump_opt_cmmOpt_D_dump_simpl_statsOpt_D_dump_cs_traceOpt_D_dump_tc_traceOpt_D_dump_if_traceOpt_D_dump_vt_traceOpt_D_dump_splicesOpt_D_dump_BCOsOpt_D_dump_vectOpt_D_dump_avoid_vectOpt_D_dump_tickedOpt_D_dump_rttiOpt_D_source_statsOpt_D_verbose_core2coreOpt_D_verbose_stg2stg Opt_D_dump_hiOpt_D_dump_hi_diffsOpt_D_dump_minimal_importsOpt_D_dump_mod_cycles!Opt_D_dump_view_pattern_commoningOpt_D_faststring_statsOpt_DumpToFileOpt_D_no_debug_outputOpt_DoCoreLintingOpt_DoStgLintingOpt_DoCmmLintingOpt_DoAsmLintingOpt_NoLlvmManglerOpt_WarnIsErrorOpt_PrintExplicitForallsOpt_StrictnessOpt_FullLaziness Opt_FloatInOpt_Specialise Opt_StaticArgumentTransformationOpt_CSEOpt_LiberateCaseOpt_SpecConstrOpt_DoLambdaEtaExpansionOpt_IgnoreAssertsOpt_DoEtaReduction Opt_CaseMergeOpt_UnboxStrictFieldsOpt_DictsCheapOpt_EnableRewriteRules Opt_Vectorise Opt_AvoidVect Opt_RegsGraphOpt_RegsIterativeOpt_PedanticBottoms Opt_LlvmTBAAOpt_RegLivenessOpt_IrrefutableTuplesOpt_IgnoreInterfacePragmasOpt_OmitInterfacePragmasOpt_ExposeAllUnfoldingsOpt_AutoSccsOnIndividualCafsOpt_ProfCountEntriesOpt_PpOpt_ForceRecompOpt_ExcessPrecisionOpt_EagerBlackHoling Opt_NoHsMain Opt_SplitObjs Opt_StgStatsOpt_HideAllPackagesOpt_PrintBindResult Opt_HaddockOpt_HaddockOptionsOpt_Hpc_No_AutoOpt_BreakOnExceptionOpt_BreakOnErrorOpt_PrintEvldWithShowOpt_PrintBindContentsOpt_GenManifestOpt_EmbedManifestOpt_EmitExternalCoreOpt_SharedImplibOpt_BuildingCabalPackageOpt_SSE2 Opt_SSE4_2Opt_IgnoreDotGhciOpt_GhciSandboxOpt_GhciHistoryOpt_HelpfulErrorsOpt_DeferTypeErrors Opt_ParallelOpt_GranMacrosOpt_PprCaseAsLet Opt_RunCPS Opt_RunCPSZOpt_AutoLinkPackagesOpt_ImplicitImportQualifiedOpt_TryNewCodeGenOpt_KeepHiDiffsOpt_KeepHcFilesOpt_KeepSFilesOpt_KeepTmpFilesOpt_KeepRawTokenStreamOpt_KeepLlvmFilesOpt_DistrustAllPackagesOpt_PackageTrustDynFlagSf_None Sf_UnsafeSf_TrustworthySf_SafeSf_SafeInferredSafeHaskellMode llvmVersioninteractivePrintprofAuto traceLevel ghciScriptshaddockOptionsflushErrflushOut log_actionextensionFlags extensionswarnUnsafeOnLoc warnSafeOnLoc pkgTrustOnLoc newDerivOnLocthOnLoc safeHaskelllanguage warningFlagsflagsgeneratedDumps dirsToClean filesToCleanpkgState pkgDatabase packageFlags extraPkgConfs depSuffixesdepExcludeModsdepIncludePkgDeps depMakefilepluginModNameOptspluginModNameshpcDirrtsOptsEnabledrtsOptscmdlineFrameworksframeworkPaths libraryPaths includePathsdumpPrefixForce dumpPrefix dynLibLoaderoutputHi outputFilehiSufhcSuf objectSufdumpDirstubDirhiDirdylibInstallName objectDir splitInfo rtsBuildTagbuildTagways thisPackage ctxtStkDepth mainFunIs mainModIs importPathscmdlineHcIncludes floatLamArgsliberateCaseThresholdspecConstrCountspecConstrThresholdsimplTickFactorstrictnessBefore ruleCheckshouldDumpSimplPhasemaxSimplIterations simplPhasesoptLevel verbosity extCoreName hscOutNamesettings hscTargetghcLinkghcModeHscCHscAsmHscLlvmHscInterpreted HscNothing HscTarget CompManagerOneShotMkDependGhcModeNoLink LinkBinary LinkInMemory LinkDynLibGhcLink LogActionStaticFlagParserparseStaticFlagsHsImpExp pprImpExpieNamesieNamesimpleImportDecl LImportDecl ideclHidingideclAs ideclImplicitideclQualified ideclSafe ideclSource ideclPkgQual ideclName ImportDeclLIEIEVar IEThingAbs IEThingAll IEThingWithIEModuleContentsIEGroupIEDoc IEDocNamedIEHsTypespprParendHsTypepprConDeclFieldsppr_hs_context pprHsContext pprHsForAllsplitHsFunTypesplitLHsClassTy_maybesplitHsClassTy_maybesplitLHsInstDeclTy_maybe mkHsAppTys splitHsAppTyshsLTyVarLocNameshsLTyVarLocNamehsLKiTyVarNames hsLTyVarNames hsLTyVarName hsTyVarName hsExplicitTvsmkExplicitHsForAllTymkImplicitHsForAllTymkHsOpTy hsIPNameFS mkHsWithBndrs hsQTvBndrsmkHsQTvsgetBangStrictness getBangType HsQuasiQuote LBangTypeBangType LHsContext HsContextLHsTypeHsKindLHsKind LHsTyVarBndrhsq_tvshsq_kvsHsQTvs LHsTyVarBndrshswb_tvshswb_kvshswb_ctsHsWB HsWithBndrsHsIPName UserTyVar KindedTyVar HsTyVarBndr HsForAllTyHsTyVarHsAppTyHsFunTyHsListTyHsPArrTy HsTupleTyHsOpTyHsParTy HsIParamTyHsEqTy HsKindSigHsQuasiQuoteTy HsSpliceTyHsDocTyHsBangTyHsRecTyHsCoreTyHsExplicitListTyHsExplicitTupleTyHsTyLitHsWrapTyHsNumTyHsStrTyWpKiApps HsTyWrapperHsUnboxedTuple HsBoxedTupleHsConstraintTupleHsBoxedOrConstraintTuple HsTupleSortExplicitImplicitHsExplicitFlag cd_fld_doc cd_fld_type cd_fld_name ConDeclFieldHsDoc ppr_mbDoc HsDocString LHsDocString overLitTypeplaceHolderKindplaceHolderType PostTcKind PostTcTypeHsChar HsCharPrimHsString HsStringPrimHsInt HsIntPrim HsWordPrim HsInt64Prim HsWord64Prim HsIntegerHsRat HsFloatPrim HsDoublePrimol_type ol_witness ol_rebindableol_valOverLit HsIntegral HsFractional HsIsString OverLitValpprLExprpprExpr pprSplice pprPatBind pprFunBindLHsExpr SyntaxExprTypesplitForAllTys funResultTyKindsynTyConResKindTysPrim alphaTyVarsTypeRep pprTypeApp pprForAllpprThetaArrowTy pprParendType ThetaTypeAnIdADataConATyConACoAxiomTyContyConClass_maybe isClassTyCon synTyConType synTyConDefn tyConDataCons isFamilyTyCon isSynTyCon isNewTyCon isPrimTyCon tyConArity tyConTyVarsRdrNameUnqualQualisVanillaDataCon pprFundeps classTvsFdsclassATs classMethods classSCTheta isFunTyConVar isExportedId isGlobalId isLocalIdTyVarNameisExternalName nameSrcSpangetName getOccName NamedThingModule pprModulemkModule mkModuleNamemoduleNameString ml_obj_file ml_hi_file ml_hs_file ModLocation DriverPhases HsSrcFile HscSourceCppPhase mkLocMessage SevOutputSevDumpSevInfo SevWarningSevErrorSevFatalSeverityMsgDocBag bagToList BasicTypesfailed succeededisMarkedStrict compareFixity negateFixity defaultFixity maxPrecedenceFixityInfixLInfixRInfixNFixityDirectionHsNoBangHsStrictHsUnpackHsUnpackFailed HsNoUnpackHsBang MarkedStrictNotMarkedStrictStrictnessMark SucceededFailed SuccessFlagPatLPatSrcLoc isSubspanOfspansleftmost_largestleftmost_smallest rightmost cmpLocated eqLocatedaddCLoc combineLocsmkGeneralLocatednoLocgetLocunLoc srcSpanEnd srcSpanStart srcSpanEndColsrcSpanStartColsrcSpanEndLinesrcSpanStartLine isGoodSrcSpan mkSrcSpan srcLocSpan noSrcSpan srcLocCol srcLocLine srcLocFilenoSrcLoc mkRealSrcLocmkSrcLoc RealSrcLoc UnhelpfulLoc srcSpanFile RealSrcSpan UnhelpfulSpanSrcSpanL GenLocatedLocatedTyThingPredType OutputableshowSDocUnqualshowSDocForUsershowSDoc withPprStyledefaultErrStyle alwaysQualifyPprStylePrintUnqualifiedpprtracingDynFlags pprUserLengthpprCols nameModulePrettyDoc StringBufferstringToStringBuffer FastStringfsLitPanicshowGhcException PhaseFailedSignal UsageError CmdLineErrorPprPanicSorryPprSorryInstallationError ProgramErrorPprProgramError Exceptiongfinallygbracketgcatch moduleNamemodulePackageId PackageIdSDoc BreakArraygetBreak setBreakOff setBreakOnResumeghc-mtl-1.0.1.2Control.Monad.GhcrunGhcTGhcTsupportedExtensions modToIIMod iiModToModsetContextModulesgetContextNamesconfigureDynFlags fileTargetpprTypepprKind PhantomModulepm_namepm_file GhcErrLogger SessionData internalStateversionSpecific ghcErrListRef ghcErrLoggerRunGhc5RunGhc4RunGhc3RunGhc2RunGhc1RunGhcInterpreterSessionInterpreterConfigurationConf search_path language_extsall_mods_in_scopeInterpreterStateStactive_phantomszombie_phantomshint_support_moduleimport_qual_hack_mod qual_imports defaultExts configurationModifySessionRef FromSessionadjustmapGhcExceptionsrunGhc1runGhc2runGhc3runGhc4runGhc5 fromStateonStatemayFailmoduleIsLoaded$fExceptionInterpreterError$fErrorInterpreterErroranns_set_get setGhcOptions setGhcOption defaultConfextFlagfromConfonConf asModElemList asModElem getUnqualName FromGhcRep FromGhcRep_ fromGhcRep_ fromGhcRep parseModule' isSucceeded$fFromGhcRep_Module[]$fFromGhcRep_Kind[]$fFromGhcRepType[]$fFromGhcRepTypeHsQualTypecleanPhantomModules ModuleTextnewPhantomModuleallModulesInContextaddPhantomModuleremovePhantomModulegetPhantomModulesisPhantomModuledoLoadmodNameFromSummarygetLoadedModSummariesonAnEmptyContextinstallSupportModulereinstallSupportModule altStringName altShowNamesupport_String support_showrunInterpreterWithArgsunInterpreterTexecute runGhc_impl showGhcEx initialize uniqueTokenifInterpreterNotRunning initialStatenewSessionData mkLogHandler mkGhcError$fApplicativeInterpreterT($fMonadErrorInterpreterErrorInterpreterT$fMonadInterpreterInterpreterT!$fShowMultipleInstancesNotAllowed&$fExceptionMultipleInstancesNotAllowed$fMonadTransInterpreterT ParseErrorParseOk parseExpr runParserfailOnParseError sandboxed old_sandboxed usingAModuletypeChecks_unsandboxedtypeOf_unsandboxedonCompilationErrorbaseGHC.ShowShowunsafeInterprettransformers-0.3.0.0Control.Monad.IO.ClassliftIOControl.Monad.Trans.Classlift MonadTransMonadIO