September 2016 Archives by thread
Starting: Thu Sep 1 04:57:56 UTC 2016
Ending: Fri Sep 30 20:31:38 UTC 2016
Messages: 933
- [GHC] #12491: ghc-iserv pattern match failure with no command line arguments
GHC
- [GHC] #12469: Memory fence on writeIORef missing on ARM
GHC
- [GHC] #12206: No exposed API to get full text of ErrMsg
GHC
- [GHC] #12504: Windows: Using hsc2hs in combination with inline-c generates the .c files with invalid paths
GHC
- [GHC] #10635: -fwarn-redundant-constraints should not be part of -Wall
GHC
- [GHC] #12170: Add flag to control whether out of scope variables should be deferred with -fdefer-typed-holes
GHC
- [GHC] #11832: Allow reify to yield types in the current declaration group
GHC
- [GHC] #10858: Smaller generated Ord instances
GHC
- [GHC] #12523: Constructor info tables generated by GHCi don't return tagged pointers
GHC
- [GHC] #11656: Alllow static pointers to local closed definitions
GHC
- [GHC] #12356: StaticPointers support in GHCi
GHC
- [GHC] #1544: Derived Read instances for recursive datatypes with infix constructors are too inefficient
GHC
- [GHC] #9557: Deriving instances is slow
GHC
- [GHC] #7258: Compiling DynFlags is jolly slow
GHC
- [GHC] #7450: Regression in optimisation time of functions with many patterns (6.12 to 7.4)?
GHC
- [GHC] #9669: Long compile time/high memory usage for modules with many deriving clauses
GHC
- [GHC] #10980: Deriving Read instance from datatype with N fields leads to N^2 code size growth
GHC
- [GHC] #12398: Expose 'withCleanupSession' as a replacement for 'defaultCleanupHandler'
GHC
- [GHC] #12559: Don't ignore addTopDecls in addModFinalizer
GHC
- [GHC] #12485: -package-db flags now need to be sorted by dependency order
GHC
- [GHC] #12476: Error building HList
GHC
- [GHC] #12490: With RebindableSyntax, ApplicativeDo should eliminate return/pure
GHC
- [GHC] #11565: Restore code to handle '-fmax-worker-args' flag
GHC
- [GHC] #12443: DEFAULT_TMPDIR is documented, but doesn't exist
GHC
- [GHC] #12560: ‘:info TYPE’ mentions any instance that includes ‘Type’
GHC
- [GHC] #12533: Internal error using redundant forall with default signature
GHC
- [GHC] #4239: -ddump-minimal-imports vs. type operators
GHC
- [GHC] #12517: Simplify runghc command line options
GHC
- [GHC] #12469: Memory fence on writes to MutVar/Array missing on ARM (was: Memory fence on writeIORef missing on ARM)
GHC
- [GHC] #12466: Typechecker regression: Inaccessible code in a type expected by the context
GHC
- [GHC] #12209: Windows: ByteCodeLink can't find labels "lseek" and "write"
GHC
- [GHC] #12496: GHCi reports unknown symbols in Win32 when linking C and C++ libs
GHC
- [GHC] #12497: Make runtime linker be able to find POSIX functions under their deprecated name.
GHC
- [GHC] #12193: Include target versions of unlit and hsc2hs when cross-compiling
GHC
- [GHC] #12479: build fail of commercialhaskell.com with stack build on mac os x sierra beta 4
GHC
- [GHC] #12555: bindist configure checks involving the compiler are broken
GHC
- [GHC] #12487: configure.ac uses wrong triple information.
GHC
- [GHC] #9221: (super!) linear slowdown of parallel builds on 40 core machine
GHC
- [GHC] #10923: GHC should recompile if flags change
GHC
- [GHC] #12557: Regression in type inference with ImpredicativeTypes (was: Regression in type inference with RankNTypes)
GHC
- [GHC] #12557: Regression in type inference with ImpredicativeTypes
GHC
- [GHC] #12427: Type inference regression with RankNTypes (GHC 8.1)
GHC
- [GHC] #12561: Scope extrusion in Template Haskell
GHC
- [GHC] #12557: Regression in type inference with RankNTypes (was: Regression in type inference with ImpredicativeTypes)
GHC
- [GHC] #12557: Regression in type inference with RankNTypes
GHC
- [GHC] #12553: Reference kind in a type instance declaration defined in another instance declaration
GHC
- [GHC] #12164: Type signatures in patterns not (yet) handled by Template Haskell
GHC
- [GHC] #11179: Allow plugins to access "dead code"
GHC
- [GHC] #11740: RFC kind synonyms
GHC
- [GHC] #12562: GHC panic on rebuild (idInfo r_XsTP)
GHC
- [GHC] #12549: Panic on ":t datatypeName"
GHC
- [GHC] #12563: Bad error message around lack of impredicativity
GHC
- [GHC] #12564: Type family in type pattern kind
GHC
- [GHC] #10161: GHC does not relink if we link against a new library with old timestamp (was: GHC does not relink if a library's code changed)
GHC
- [GHC] #10161: GHC does not relink if we link against a new library with old timestamp
GHC
- [GHC] #12565: unhelpful error message about enabling TypeApplications
GHC
- [GHC] #12566: Memory leak
GHC
- [GHC] #12567: `ghc --make` recompiles unchanged files when using `-fplugin` OPTIONS
GHC
- [GHC] #10986: GHC should delete all temporary files it creates in /tmp
GHC
- [GHC] #12547: Concurrent.ForeignPtr needs to access a C-ForeignPtr, but this is already gone
GHC
- [GHC] #12568: Release hsc2hs new version to Hackage
GHC
- [GHC] #11024: Fix strange parsing of BooleanFormula
GHC
- [GHC] #4806: Make error message more user friendly when module is not found because package is unusable
GHC
- [GHC] #12569: TypeApplications doesn't allow unticked list constructors.
GHC
- [GHC] #12570: Different behaviour in Linux and Mac OS when using some locale environments
GHC
- [GHC] #12556: `stimes` adds extra power to Semigroup
GHC
- [GHC] #12571: GHC panic
GHC
- [GHC] #12572: `readdir_r` is deprecated
GHC
- [GHC] #11108: Weak references related crash
GHC
- [GHC] #12386: Infinite loop when showing type family error
GHC
- [GHC] #12174: Recursive use of type-in-type results in infinite loop
GHC
- [GHC] #12573: Allow the user to pick the address that the RTS reserves for the heap
GHC
- [GHC] #5615: ghc produces poor code for `div` with constant powers of 2.
GHC
- [GHC] #12546: GeneralizedNewtypeDeriving produces error messages with incorrect kind signatures
GHC
- [GHC] #5642: Deriving Generic of a big type takes a long time and lots of space
GHC
- [GHC] #11959: Importing doubly exported pattern synonym and associated pattern synonym panics
GHC
- [GHC] #12472: "lazy" is not optimized away
GHC
- [GHC] #12076: "lazy" leads to undefined reference to `stg_ap_0_upd_info'
GHC
- [GHC] #12010: Incorrect return types for recv() and send() on Windows
GHC
- [GHC] #12216: GHC 8.0.1 panics when compiling JuicyPixels-repa 0.7.1
GHC
- [GHC] #12066: Symbol not found: _stg_ap_0_upd_info
GHC
- [GHC] #11196: TypeInType performance regressions
GHC
- [GHC] #11549: Add -fshow-runtime-rep
GHC
- [GHC] #11981: unknown symbol `__udivti3' when BuildFlavour = perf-llvm
GHC
- [GHC] #11197: Overeager deferred type errors
GHC
- [GHC] #10789: Notify user when a kind mismatch holds up a type family reduction
GHC
- [GHC] #11836: Hello World Bug - silent stdout errors
GHC
- [GHC] #12100: GHC 8.0.1 build segmentation fault in haddock
GHC
- [GHC] #11691: Documentation indicates RelaxedPolyRec is optional
GHC
- [GHC] #11126: Entered absent arg in a Repa program
GHC
- [GHC] #4820: "Invalid object in isRetainer" when doing retainer profiling in GHC 7 branch
GHC
- [GHC] #12019: Profiling option -hb is not thread safe
GHC
- [GHC] #12055: Typechecker panic instead of proper error
GHC
- [GHC] #12090: Document Weverything/Wall/Wextra/Wdefault in user's guide
GHC
- [GHC] #12519: Rendered Haddock for Eq and Ord are missing class methods
GHC
- [GHC] #12133: ConstraintKinds inference failure (regression from 7.10)
GHC
- [GHC] #11827: InteractiveEval error handling gets a boot ModSummary instead of normal ModSummary
GHC
- [GHC] #7411: Exceptions are optimized away in certain situations
GHC
- [GHC] #1851: "make install-strip" should work
GHC
- [GHC] #11978: running a profiled build of shake test suite with rts args +RTS -hb -N10 triggers SIGSEGV
GHC
- [GHC] #12421: TestEquality and TestCoercion documentation is confusing
GHC
- [GHC] #12425: With -O1 and above causes ghc to use all available memory before being killed by OOM killer
GHC
- [GHC] #11606: name shadowing warnings don't trigger on standalone declarations in ghci
GHC
- [GHC] #12150: Compile time performance degradation on code that uses undefined/error with CallStacks
GHC
- [GHC] #12433: GHCi produces incorrect results when evaluating with compiled code
GHC
- [GHC] #12367: Commit adding instances to GHC.Generics regression compiler performance
GHC
- [GHC] #10062: Codegen on sequential FFI calls is not very good
GHC
- [GHC] #8048: Register spilling produces ineffecient/highly contending code
GHC
- [GHC] #5972: option to suppress (Monomorphic) record selector functions
GHC
- [GHC] #9370: unfolding info as seen when building a module depends on flags in a previously-compiled module
GHC
- [GHC] #11990: Custom Type Error not getting triggered in the nested Type function call
GHC
- [GHC] #12574: Consistent use of sigs vs signatures in warnings
GHC
- [GHC] #12575: Support US spelling of `specialise` throughout
GHC
- [GHC] #8763: forM_ [1..N] does not get fused (10 times slower than go function)
GHC
- [GHC] #12576: Large Address space is unenable-able on Windows.
GHC
- [GHC] #12577: The flag -xb has no effect on Windows
GHC
- [GHC] #12578: Update links to SPJ’s papers
GHC
- [GHC] #12579: Allowed to create non-alphanumeric data / newtype constructor that cannot be used
GHC
- [GHC] #1965: Allow unconstrained existential contexts in newtypes
GHC
- [GHC] #9880: ghc crashes on th splices in instance context
GHC
- [GHC] #12580: Eagerly simplify inherently-coherent instances
GHC
- [GHC] #12537: ghc-openGL build Segmentation Fault for openSUSE ppc64le
GHC
- [GHC] #12088: Type/data family instances in kind checking
GHC
- [GHC] #11433: sphinx: Error: source directory and destination directory are same.
GHC
- [GHC] #8472: Primitive string literals prevent optimization
GHC
- [GHC] #8581: Pattern synonym used in an expression context could have different constraints to pattern used in a pattern context
GHC
- [GHC] #393: functions without implementations
GHC
- [GHC] #12581: Testsuite segfaults on OS X
GHC
- [GHC] #12469: Memory fence on writes to MutVar/Array missing on ARM
GHC
- [GHC] #12582: HSOC Eventlog live profiling
GHC
- [GHC] #12583: Deriving standalone Ix instance for GADT leads to GHC panic
GHC
- [GHC] #9291: Don't reconstruct sum types if the type subtly changes
GHC
- [GHC] #12584: Bug (or Unhelpful Error) with TemplateHaskell
GHC
- [GHC] #12585: GHC duplicates string literals in rodata section and breaks 'Ptr Addr#' equality
GHC
- [GHC] #1409: Allow recursively dependent modules transparently (without .hs-boot or anything)
GHC
- [GHC] #12586: Add types warning to Foreign.C.Types
GHC
- [GHC] #4210: LLVM: Dynamic Library Support
GHC
- [GHC] #10807: PatternGuards and MultiWayIf layout rules
GHC
- [GHC] #9089: Local .ghci_history
GHC
- [GHC] #12587: InstanceSigs doesn't work with ambigous types
GHC
- [GHC] #12503: Template Haskell regression: GHC erroneously thinks a type variable is also a kind
GHC
- [GHC] #12588: GHC bug, compiling Stack master on macOS Sierra
GHC
- [GHC] #12540: RFC: Allow not quantifying every top-level quantifiee
GHC
- [GHC] #12589: GHC panic with defer-typed-holes
GHC
- [GHC] #12590: GHC panics, -XTypeInType, possibly "cobox" related
GHC
- [GHC] #3399: Generalize the type of Data.List.{deleteBy, deleteFirstsBy}
GHC
- [GHC] #10352: Properly link Haskell shared libs on all systems
GHC
- [GHC] #11548: Absolutely misleading error message on kind error
GHC
- [GHC] #11672: Poor error message
GHC
- [GHC] #11312: GHC inlining primitive string literals can affect program output
GHC
- [GHC] #12413: Compact regions support needs some discussion in the release notes
GHC
- [GHC] #12380: ghc: panic! (the 'impossible' happened)
GHC
- [GHC] #11369: Suppress redundant-constraint warnings in case of empty classes
GHC
- [GHC] #12031: GHCi segfaults on Windows when compiling C code using extern-declared variable
GHC
- [GHC] #12220: TypeApplications and DefaultSignatures - problems deducing type variables.
GHC
- [GHC] #12488: Explicit namespaces doesn't enforce namespaces
GHC
- [GHC] #11629: reify returns Dec that use ConT instead of PromotedT
GHC
- [GHC] #11955: Haddock documentation for pattern synonyms printed with explicit forall quantifiers
GHC
- [GHC] #10946: Typed hole inside typed Template Haskell bracket causes panic
GHC
- [GHC] #10945: Typed Template Haskell splices broken in HEAD (7.11)
GHC
- [GHC] #8761: Make pattern synonyms work with Template Haskell
GHC
- [GHC] #10267: Add support for typed holes in Template Haskell
GHC
- [GHC] #11295: Figure out what LLVM passes are fruitful
GHC
- [GHC] #10835: Regression in standalone Data deriving for phantom types
GHC
- [GHC] #12591: Profiled build broken
GHC
- [GHC] #12592: Explicit type signature for type classes fails
GHC
- [GHC] #12045: Visible kind application
GHC
- [GHC] #12593: ghci spins forever
GHC
- [GHC] #12594: DeriveAnyClass fails to derive some classes
GHC
- [GHC] #12595: Linker failure: multiple definition of
GHC
- [GHC] #12160: MonadFail instance for (Either String)?
GHC
- [GHC] #7019: Wrong error message when using forall in constraints
GHC
- [GHC] #12596: can't find interface-file declaration
GHC
- [GHC] #12015: Add conditional CallStack constraints to common partial utility functions
GHC
- [GHC] #11660: Remove Type pretty-printer in favor of IfaceType
GHC
- [GHC] #12597: -Wmissing-signatures uses forall even when invalid in source
GHC
- [GHC] #12598: configure script: --enable-unregisterised default printed incorrectly
GHC
- [GHC] #12152: panic: Loading temp shared object failed
GHC
- [GHC] #10458: GHCi fails to load shared object (the 'impossible' happened)
GHC
- [GHC] #12494: Implementation of setenv in base incorrectly claims empty environment variable not supported on Windows
GHC
- [GHC] #12370: Implement LetUp in DmdAnal (or document why we do not do it)
GHC
- [GHC] #10417: Rule matching not "seeing through" floating and type lambda (and maybe cast)
GHC
- [GHC] #12599: Add Hadrian build artifacts to gitignore
GHC
- [GHC] #11198: TypeInType error message regressions
GHC
- [GHC] #8040: installed include/HsVersions.h wants to #include "../includes/ghcautoconf.h"
GHC
- [GHC] #7611: Rewrite rules application prevented by type variable application (map id vs. map (\x -> x))
GHC
- [GHC] #5974: Casts, rules, and parametricity
GHC
- [GHC] #2110: Rules to eliminate casted id's
GHC
- [GHC] #12600: Overloaded method causes insufficient specialization
GHC
- [GHC] #12518: Allow customizing immutable package dbs by stacking
GHC
- [GHC] #11403: Provide a way to make fast in-calls into Haskell
GHC
- [GHC] #4013: build fails on OS X: Invalid Mach-O file:Address out of bounds while relocating object file
GHC
- [GHC] #12038: Shutdown interacts badly with requestSync()
GHC
- [GHC] #12601: explicit foralls do not distinguish applicable types
GHC
- [GHC] #12477: Allow left sectioning and tuple sectioning of types
GHC
- [GHC] #11819: Full validation issues for 8.0.1
GHC
- [GHC] #11371: Bogus in-scope set in substitutions
GHC
- [GHC] #12558: GHCi Segmentation fault/access violation in generated code
GHC
- [GHC] #11054: GHC on Windows could not use more than 64 logical processors
GHC
- [GHC] #12602: Add NUMA support to Windows
GHC
- [GHC] #12186: Windows linker stack commit setting causing issues
GHC
- [GHC] #12603: INLINE and manually inlining produce different code
GHC
- [GHC] #10167: Error with dash character
GHC
- [GHC] #12236: Windows profiling: T11627b segfaults for WAY=prof_hc_hb
GHC
- [GHC] #9421: Problems and workarounds when installing and using a 32bit GHC on 64bit Linux machine
GHC
- [GHC] #7430: GHC API reports CPP errors in confusing ways
GHC
- [GHC] #12369: data families shouldn't be required to have return kind *, data instances should
GHC
- [GHC] #12550: Inconsistent unicode display for kinds
GHC
- [GHC] #12388: Don't barf on failures in the RTS linker
GHC
- [GHC] #7206: Implement cheap build
GHC
- [GHC] #8457: -ffull-laziness does more harm than good
GHC
- [GHC] #9520: Running an action twice uses much more memory than running it once
GHC
- [GHC] #12537: Parallel cabal builds Segmentation Fault on PowerPC 64-bit (was: ghc-openGL build Segmentation Fault for openSUSE ppc64le)
GHC
- [GHC] #12604: panic when building repa-fftw
GHC
- [GHC] #12605: UnboxedSums causes parse error on hash operator e.g. `let (#) = (+)`
GHC
- [GHC] #12459: UnboxedTuple makes overloaded labels fail to parse
GHC
- [GHC] #12606: Linux (ELF) Support for "ghc -static -shared"
GHC
- [GHC] #12495: GHC's configure script detects MADV_FREE when it shouldn't
GHC
- [GHC] #12607: Memory effects in doomed STM transactions
GHC
- [GHC] #12522: GHC 8.0.1 hangs, looping forever in type-checker
GHC
- [GHC] #12608: Fatal error installing haskell-stack using brew OS X 10.12
GHC
- [GHC] #11505: Boot file problem
GHC
- [GHC] #12609: unused-top-binds wrongly warns about underscore-prefixed field names when DuplicateRecordFields enabled
GHC
- [GHC] #11587: Place shared objects in LIBDIR
GHC
- [GHC] #8974: 64 bit windows executable built with ghc-7.9.20140405+LLVM segfaults
GHC
- [GHC] #12610: Emit tab warning promptly
GHC
- [GHC] #12136: SIGABRT on right-shift operation against long negative integer
GHC
- [GHC] #5402: Exit code is wrong with dynamically loaded libraries
GHC
- [GHC] #12611: expression calculation error
GHC
- [GHC] #12442: Pure unifier usually doesn't need to unify kinds
GHC
- [GHC] #9248: Document -XHaskell98 and -XHaskell2010 in flag reference
GHC
- [GHC] #7181: Add documentation on heap-profile file format.
GHC
- [GHC] #12612: Allow kinds of associated types to depend on earlier associated types
GHC
- [GHC] #12613: Fix spelling of INLIN(E)ABLE in comments
GHC
- [GHC] #12511: template-haskell's Language.Haskell.Syntax module should be Trustworthy
GHC
- [GHC] #11812: Template Haskell can induce non-unique Uniques
GHC
- [GHC] #12073: Missing instance of MonadFix for Q
GHC
- [GHC] #12387: Template Haskell ignores class instance definitions with methods that don't belong to the class
GHC
- [GHC] #12126: Bad error messages for SPECIALIZE pragmas
GHC
- [GHC] #8774: Transitivity of Auto-Specialization
GHC
- [GHC] #12463: SPECIALIZABLE pragma?
GHC
- [GHC] #10598: DeriveAnyClass and GND don't work well together
GHC
- [GHC] #12614: Integer division can overwrite other arguments to foreign call
GHC
- [GHC] #12615: Record pattern synonyms cause spurious name shadowing warnings
GHC
- [GHC] #11987: Allow record wildcards with pattern synonyms which are defined in GHCi
GHC
- [GHC] #12616: type synonyms confuse generalized newtype deriving role checking
GHC
- [GHC] #12617: Make the interface of traceTc and traceRn the same
GHC
- [GHC] #12618: Add saturated constructor applications to Core
GHC
- [GHC] #9198: large performance regression in type checker speed in 7.8
GHC
- [GHC] #8523: blowup in space/time for type checking and object size for high arity tuples
GHC
- [GHC] #7428: GHC compile times are seriously non-linear in program size
GHC
- [GHC] #12619: Allow users guide to be built independently from GHC
GHC
- [GHC] #12620: Allow the user to prevent floating and CSE
GHC
- [GHC] #12537: Parallel cabal builds Segmentation Fault on PowerPC 64-bit
GHC
- [GHC] #12621: zeromq4-haskell fails on PowerPC 64-bit
GHC
- [GHC] #12622: Unboxed static pointers lead to missing SPT entries
GHC
- [GHC] #12231: Eliminate redundant heap allocations/deallocations
GHC
- you have to see that
matthew
- [GHC] #8583: Associated pattern synonyms
GHC
- [GHC] #11461: Allow pattern synonyms to be bundled with type classes?
GHC
- [GHC] #9671: Allow expressions in patterns
GHC
- [GHC] #12623: Make Harbormaster less terrible in the face of submodule updates
GHC
- [GHC] #11008: Difficulties around inferring exotic contexts
GHC
- [GHC] #12624: Un-revert PosixSource.h cleanup
GHC
- [GHC] #11342: Character kind
GHC
- [GHC] #12625: Bad error message for flags with required but missing arguments
GHC
- [GHC] #12626: Remove redundant type applications in Core
GHC
- [GHC] #12627: build sytem feature request: persist warnings
GHC
- [GHC] #12628: __GLASGOW_HASKELL_LLVM__ is no longer an Int
GHC
- [GHC] #12629: Worse performance with -O1 or -O2 due to GC cost
GHC
- [GHC] #12630: Assertion failed with BuildFlavour = devel2
GHC
- [GHC] #12631: `hpc report` silently ignore non-existent modules
GHC
- [GHC] #3919: Or-patterns as GHC extension
GHC
- [GHC] #12632: Inline and Noinline pragmas ignored for instance functions
GHC
- [GHC] #12633: Support standard syntax for language pragmas in GHCi
GHC
- [GHC] #11350: Allow visible type application in patterns
GHC
- [GHC] #12379: WARN pragma gives warning `warning: [-Wdeprecations]'
GHC
- [GHC] #12634: Panic with piResultTys1
GHC
- [GHC] #12635: Compress core in interface files
GHC
- [GHC] #12636: ProfHeap's printf modifiers are incorrect
GHC
- [GHC] #12637: ghc-pkg: Allow unregistering multiple packages in one call
GHC
- [GHC] #11499: Loading temp shared object failed in GHCi
GHC
- [GHC] #12638: GHC panic when resolving Show instance
GHC
- [GHC] #12639: Inconsistent treatment of FlexibleInstances and MPTCs with standard vs. flexible deriving
GHC
- [GHC] #12640: Class member functions not substituted for MultiParamTypeClasses
GHC
- [GHC] #9349: excessive inlining due to state hack
GHC
- [GHC] #12641: Indentation works differently for multi-way if than for guards when using comma-separate view patterns
GHC
- [GHC] #10010: LLVM/optimized code for sqrt incorrect for negative values
GHC
- [GHC] #12232: Opportunity to do better in register allocations
GHC
- [GHC] #12642: reports incorrect target arch on mips64el
GHC
- [GHC] #12643: class declaration works in ghci, but not in a file
GHC
- [GHC] #12363: Type application for infix
GHC
- [GHC] #12644: Lack of instantiation in GHC 8.0.1
GHC
- [GHC] #12645: 7.10.3 porting feedback
GHC
- [GHC] #10740: Ensure that ticky, profiler, and GC allocation numbers agree
GHC
- [GHC] #12646: Type family reification misses a kind signature
GHC
- [GHC] #12647: Can't capture improvement of functional dependencies
GHC
- [GHC] #6018: Injective type families
GHC
- [GHC] #12648: Stack overflow when using monad-unlift
GHC
- [GHC] #12649: Allow TypeApplications syntax to be used to instantiate type variables in SPECIALISE pragmas
GHC
Last message date:
Fri Sep 30 20:31:38 UTC 2016
Archived on: Tue Nov 21 21:58:32 UTC 2017
This archive was generated by
Pipermail 0.09 (Mailman edition).