[Haskell-cafe] haskell and reflection

2007-09-11 Thread Greg Meredith
Haskellians, Am i wrong in my assessment that the vast majority of reflective machinery is missing from Haskell? Specifically, - there is no runtime representation of type available for programmatic representation - there is no runtime representation of the type-inferencing or

Re: [Haskell-cafe] haskell and reflection

2007-09-11 Thread Greg Meredith
Neil, Thanks very much for the detailed response. When we did Rosette, a reflective actor-based language, back in the late '80's and early '90's, we were very much influenced by Brian Cantwell Smith's account of reflection in 3-Lisp and similarly by Friedman and Wand's Mystery of the Tower

Re: [Haskell-cafe] haskell and reflection

2007-09-11 Thread Greg Meredith
] wrote: Greg Meredith wrote: Haskellians, Am i wrong in my assessment that the vast majority of reflective machinery is missing from Haskell? Specifically, * there is no runtime representation of type available for programmatic representation * there is no runtime

[Haskell-cafe] Prime monads?

2007-09-11 Thread Greg Meredith
Haskellians, Is there a characterization of prime monads? Here the notion of factorization i'm thinking about is decomposition into adjoint situations. For example, are there monads for which there are only the Kleisli and Eilenberg-Moore decompositions into adjoint situations? Would this be a

[Haskell-cafe] help getting happy

2007-09-12 Thread Greg Meredith
Haskellians, The code pasted in below causes Happy to return parE when invoked with happy rparse.y -i . Is there anyway to get Happy to give me just a wee bit more info as to what might be causing the parE (which i interpret a 'parse error'). Best wishes, --greg { module Main where } %name

[Haskell-cafe] Re: help getting happy

2007-09-13 Thread Greg Meredith
/13/07, Simon Marlow [EMAIL PROTECTED] wrote: Greg Meredith wrote: Haskellians, The code pasted in below causes Happy to return parE when invoked with happy rparse.y -i . Is there anyway to get Happy to give me just a wee bit more info as to what might be causing the parE (which i

[Haskell-cafe] generic programming tutorial?

2007-10-17 Thread Greg Meredith
Haskellians, i feel like i'm chasing a rabbit down the rabbit hole, but here goes. i'm currently redoing my implementation of an evaluator for a reflective process calculus, using Haskell instead of OCaml, this time. i thought i'd give a James Cheney's FreshLib a whirl to - test out the state

[Haskell-cafe] SYB3 codebase

2007-10-18 Thread Greg Meredith
Haskellians, Does anyone know the status of SYB3 codebase? It appears that FreshLib critically depends on it, but the code downloadable from http://homepages.cwi.nl/~ralf/syb3/code.html dies in make test on the first test with lgmaclt:~/work/src/projex/biosimilarity/HS1/Process/haskell/SYB3 lgm$

Re: [Haskell-cafe] SYB3 codebase

2007-10-20 Thread Greg Meredith
Mads, Many thanks for your help. i really appreciate it. Best wishes, --greg On 10/19/07, Mads Lindstrøm [EMAIL PROTECTED] wrote: Hi Greg I forgot to say, that I did not stop using the Shelarcy patch because there was something wrong with the code. On the contrary it served me well for

[Haskell-cafe] surprised by type class binding -- is this a bug?

2007-12-06 Thread Greg Meredith
Haskellians, i'm sure i don't understand type classes, yet. Still, i was surprised at ghci's response to the code below. Clues gratefully accepted. Best wishes, --greg -- transcript -- Prelude :l grn -- [1 of 1] Compiling GeneticRegulatoryNetwork ( grn.hs, interpreted ) -- grn.hs:33:35: --

[Haskell-cafe] Re: surprised by type class binding -- is this a bug?

2007-12-06 Thread Greg Meredith
Haskellians, Belay that. i see the problem. Best wishes, --greg On Dec 6, 2007 11:11 PM, Greg Meredith [EMAIL PROTECTED] wrote: Haskellians, i'm sure i don't understand type classes, yet. Still, i was surprised at ghci's response to the code below. Clues gratefully accepted. Best wishes

[Haskell-cafe] grammars and generics

2007-12-11 Thread Greg Meredith
Haskellians, Here is an idea so obvious that someone else must have already thought of it and worked it all out. Consider the following grammar. N0 ::= T0 N1 | T1 N1 N0 | T2 N0 N0 N1 ::= T3 N0 where Ti (0 = i 4) are understood to be terminals. Using generics we can translate each production

Re: [Haskell-cafe] grammars and generics

2007-12-11 Thread Greg Meredith
and all involved productions too). Thus, you get empty grammar. Isn't that the problem? Shouldn't the grammar be like: N0 ::= T0 N1 | T1 N1 N0 | T2 N0 N0 N1 ::= T3 T4 ? Best regards Dusan Greg Meredith wrote: Haskellians, Here is an idea so obvious that someone else must have already

[Haskell-cafe] re: generics and grammars

2007-12-12 Thread Greg Meredith
Ken, Thanks for the references! Have two-level types been applied to parser generation? Best wishes, --greg Greg Meredith [EMAIL PROTECTED] wrote in article [EMAIL PROTECTED] in gmane.comp.lang.haskell.cafe: Here is an idea so obvious that someone else must have already thought

[Haskell-cafe] Monadic presentation of delimited continuations and dissection

2010-06-09 Thread Greg Meredith
Dear Haskellians, After reading through the Dybvig, Jones and Sabry paper on the monadic presentation of delimited continuations, it seems like one can come up with a direct representation of the control contexts and meta continuations framework as an instance of McBride's dissection mechanism.

[Haskell-cafe] C9 video on monads and coordinate systems

2010-07-07 Thread Greg Meredith
Dear Haskellians, You may be interested in this video i did with Brian Beckmanhttp://channel9.msdn.com/shows/Going+Deep/E2E-Whiteboard-Jam-Session-with-Brian-Beckman-Greg-Meredith-Monads-and-Coordinate-Systems/on monads, location and coordinate systems. Best wishes, --greg -- L.G. Meredith

[Haskell-cafe] monadic design patterns for the web -- a 2 day, hands-on workshop

2010-07-07 Thread Greg Meredith
Dear Haskellians, Biosimilarity and Stellar Scala Consulting will be running a 2 day workshop in Seattle in September on monadic design patterns for the web. You can get the details here http://monadic.eventbrite.com/. Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC

Re: [Haskell-cafe] C9 video on monads and coordinate systems

2010-07-08 Thread Greg Meredith
) data RT = RT (T (RN RT)) deriving (Eq, Show) Best wishes, --greg On Thu, Jul 8, 2010 at 6:15 AM, Felipe Lessa felipe.le...@gmail.com wrote: On Wed, Jul 7, 2010 at 8:00 PM, Greg Meredith lgreg.mered...@biosimilarity.com wrote: Dear Haskellians, You may be interested in this video i did

[Haskell-cafe] lambda terms in which the variables are positions in lambda terms

2010-07-20 Thread Greg Meredith
Dear Haskellians, The following code may provide some amusement. i offer a free copy of Barwise's Vicious Circles to the first person to derive deBruijn indices from this presentation. Best wishes, --greg -- -*- mode: Haskell;-*- -- Filename:Term.hs -- Authors: lgm -- Creation:Tue

[Haskell-cafe] Fwd: NW Functional Programming Interest Group

2008-02-20 Thread Greg Meredith
All, Apologies for multiple listings. This is just a friendly reminder that a small cadre of us are organizing a Northwest Functional Programming Interest Group. Our first official meeting is today at the The Seattle Public Library 1000 - 4th Ave. Seattle, WA 98104 Spiral 6 Conference Room

[Haskell-cafe] Naming as infection

2008-03-13 Thread Greg Meredith
All, Here http://biosimilarity.blogspot.com/2008/03/naming-as-dialectic.html is a deliberately provocative posting (with running code and a shameless plug for BNFC) on the process of introducing naming and name management into the design of data structures. Comments greatly appreciated. Best

[Haskell-cafe] 2-level type analysis of introducing naming into data types

2008-03-15 Thread Greg Meredith
All, The following Haskell code gives a 2-level type analysis of a functorial approach to introducing naming and name management into a given (recursive) data type. The analysis is performed by means of an example (the type of Conway games). The type is naturally motivated because through the

Re: [Haskell-cafe] 2-level type analysis of introducing naming into data types

2008-03-17 Thread Greg Meredith
. Best wishes, --greg On Mon, Mar 17, 2008 at 8:52 AM, Justin Bailey [EMAIL PROTECTED] wrote: 2008/3/15 Greg Meredith [EMAIL PROTECTED]: All, The following Haskell code gives a 2-level type analysis of a functorial approach to introducing naming and name management into a given

[Haskell-cafe] NW Functional Programming Interest Group

2008-03-18 Thread Greg Meredith
All, Apologies for multiple listings. A small cadre of us are organizing a Northwest Functional Programming Interest Group (hey... NWFPIG, that's kinda funny). Our next meeting is at the The Seattle Public Library 1000 - 4th Ave. Seattle, WA 98104 from 18:30 - 20:00 on March 19th. On this

[Haskell-cafe] Haskell vs Scheme

2008-04-01 Thread Greg Meredith
Douglas, Excellent questions you posed to Simon P-J -- who then forwarded them to the Haskell Cafe list. By way of answering i should say i was a Schemer from the get-go; it was really the first programming language i studied as an undergraduate majoring in maths at Oberlin in the early 80's.

[Haskell-cafe] NW Functional Programming Interest Group

2008-04-15 Thread Greg Meredith
All, Apologies for multiple listings. It's that time again. Our growing cadre of functionally-minded north westerners is meeting at the The Seattle Public Library 1000 - 4th Ave. Seattle, WA 98104 from 18:30 - 20:00 on April 16th. This meeting's agenda is a little more fluid, but... - i

[Haskell-cafe] NW Functional Programming Interest Group

2008-05-16 Thread Greg Meredith
All, Apologies for multiple listings. It's that time again. Our growing cadre of functionally-minded north westerners is meeting at the The Seattle Public Library *University Branch* 5009 Roosevelt Way N.E. *Seattle*, WA 98105 206-684-4063 from 18:30 - 20:00 on May 28th. Note the change

[Haskell-cafe] NW Functional Programming Interest Group

2008-06-24 Thread Greg Meredith
All, Apologies for multiple listings. A small cadre of us, collectively known as the Northwest Functional Programming Interest Group, have been meeting monthly to discuss all things functional. Our next meeting is at The Seattle Public Library 5009 Roosevelt Way N.E. * Seattle*, WA 98105

re: [Haskell-cafe] Swapping Monads

2008-07-09 Thread Greg Meredith
Dominic, You can also reference Eugenia Cheng's paper on arXivhttp://arxiv.org/abs/0710.1120 . Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 806 55th St NE Seattle, WA 98105 +1 206.650.3740 http://biosimilarity.blogspot.com

[Haskell-cafe] Fwd: NW Functional Programming Interest Group

2008-07-18 Thread Greg Meredith
All, Apologies for multiple listings. This is just a friendly reminder to Northwest functionally minded folks that this month's meeting is to be held The Seattle Public Library 5009 Roosevelt Way N.E. Seattle, WA 98105 206-684-4063 from 18.30 - 19:45 on July 23rd. We'll be getting a demo of a

[Haskell-cafe] Monadic design patterns for the web Kickstarter project

2010-12-02 Thread Greg Meredith
Dear Haskellians, Last week i went in to record the 2nd and 3rd installments of the C9 monadic design patterns for the web videos. Charles Torre, the series producer, told me there were over 40K distinct views of the first video. i know that many of them came from this community. So, i really

[Haskell-cafe] Monads in the 'hood

2010-12-09 Thread Greg Meredith
Dear Haskellians, Keepin' it light. For your amusement this weekend: monads in the hoodhttp://www.youtube.com/watch?v=rYANU61J5eY . Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 1219 NW 83rd St Seattle, WA 98117 +1 206.650.3740 http://biosimilarity.blogspot.com

[Haskell-cafe] Monadic Design Patterns for the Web C9 Video Series -- Part 2 is live!

2010-12-16 Thread Greg Meredith
. Front and center: http://channel9.msdn.com/Shows/Going+Deep/C9-Lectures-Greg-Meredith-Monadic-Design-Patterns-for-the-Web-2-of-n Thank you! See you in the new year to continue with this great series. Best, C -- L.G. Meredith Managing Partner Biosimilarity LLC 1219 NW 83rd St Seattle, WA

[Haskell-cafe] Haskell on JVM

2009-06-24 Thread Greg Meredith
Simon, et al, It might be interesting to look at CALhttp://labs.businessobjects.com/cal/as a non-blank-slate beginning for Haskell on the JVM. To my mind there are three things that this needs to make it a real winner: - Much, much better Java interop. Basically, the bar to meet here is

Re: [Haskell-cafe] Haskell on JVM

2009-06-25 Thread Greg Meredith
Jason, CAL's syntax is not std Haskell syntax. Best wishes, --greg On Thu, Jun 25, 2009 at 11:10 AM, Jason Dusek jason.du...@gmail.com wrote: 2009/06/24 Greg Meredith lgreg.mered...@biosimilarity.com: Better support for std Haskell syntax What does this mean, actually? Better support

[Haskell-cafe] Composition, delegation and interfaces -- a 20K ft critique of Noop

2009-09-17 Thread Greg Meredith
Dear Programmers, Someone just asked me to give my opinion on Noop's composition proposalhttp://code.google.com/p/noop/wiki/ProposalForComposition. It reminds me a little bit of Selfhttp://en.wikipedia.org/wiki/Self_%28programming_language%29which found its way into JavaScript. It also reminds me

[Haskell-cafe] Semantic Domain, Function, and denotational model.....

2008-09-16 Thread Greg Meredith
Daryoush, Hopefully, the other replies about proving the monad laws already answered your previous question: yes! As for notions of semantic domain and denotational model, these ideas go back quite a ways; but, were given solid footing by Dana Scotthttp://en.wikipedia.org/wiki/Dana_Scott. In a

Re: [Haskell-cafe] Semantic Domain, Function, and denotational model.....

2008-09-17 Thread Greg Meredith
2008/9/16 Greg Meredith [EMAIL PROTECTED]: Daryoush, Hopefully, the other replies about proving the monad laws already answered your previous question: yes! As for notions of semantic domain and denotational model, these ideas go back quite a ways; but, were given solid footing by Dana

[Haskell-cafe] Ajax-Haskell framework?

2008-09-17 Thread Greg Meredith
Haskellians, Is there an Ajax-Haskell framework? In case there are many, is there a preferred one? Experiences people would like to share? Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 806 55th St NE Seattle, WA 98105 +1 206.650.3740

re: [Haskell-cafe] ANNOUNCE: rewriting-0.1

2008-11-08 Thread Greg Meredith
Thomas, Did you explore nominal rewrite at all? Do you know if it might be possible to use the scrap-your-nameplate package to implement some useful subset of the nominal rewrite machinery? Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 806 55th St NE Seattle, WA

[Haskell-cafe] monads with take-out options

2008-11-24 Thread Greg Meredith
Haskellians, Some monads come with take-out options, e.g. - List - Set In the sense that if unit : A - List A is given by unit a = [a], then taking the head of a list can be used to retrieve values from inside the monad. Some monads do not come with take-out options, IO being a notorious

Re: [Haskell-cafe] monads with take-out options

2008-11-24 Thread Greg Meredith
could have as big an impact on our understanding of the properties of computation as the development of the periodic table had on our understanding of material properties. On Mon, Nov 24, 2008 at 2:30 PM, Jonathan Cast [EMAIL PROTECTED]wrote: On Mon, 2008-11-24 at 14:06 -0800, Greg Meredith wrote

Re: [Haskell-cafe] monads with take-out options

2008-11-24 Thread Greg Meredith
Brandon, i see your point, but how do we sharpen that intuition to a formal characterization? Best wishes, --greg On Mon, Nov 24, 2008 at 10:45 PM, Brandon S. Allbery KF8NH [EMAIL PROTECTED] wrote: On 2008 Nov 24, at 17:06, Greg Meredith wrote: Now, are there references for a theory

Re: [Haskell-cafe] monads with take-out options

2008-11-24 Thread Greg Meredith
Claus, Thanks for your thoughtful response. Let me note that fully abstract semantics for PCF -- a total toy, mind you, just lambda + bools + naturals -- took some 25 years from characterization of the problem to a solution. That would seem to indicate shoe-horning, in my book ;-). Moreover, when

[Haskell-cafe] re: monads with take-out options

2008-11-25 Thread Greg Meredith
at 02:06:33PM -0800, Greg Meredith wrote: Now, are there references for a theory of monads and take-out options? For example, it seems that all sensible notions of containers have take-out. Can we make the leap and define a container as a monad with a notion of take-out? Has this been done

[Haskell-cafe] haskell compiler never comes back

2008-12-15 Thread Greg Meredith
Haskellians, The simple-minded and smallish code sample at this linkhttp://paste.pocoo.org/show/95503/causes the compiler to go off into never-never land. Any clues would be greatly appreciated. Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 806 55th St NE Seattle, WA

[Haskell-cafe] Re: haskell compiler never comes back

2008-12-15 Thread Greg Meredith
Haskellians, An even simpler version http://paste.pocoo.org/show/95518/ that reveals the issue. i'm astounded that the compiler literally just hangs. Best wishes, --greg On Mon, Dec 15, 2008 at 12:23 PM, Greg Meredith lgreg.mered...@biosimilarity.com wrote: Haskellians, The simple-minded

Re: [Haskell-cafe] Re: haskell compiler never comes back

2008-12-15 Thread Greg Meredith
George, Thanks for the response. If i take out the AllowUndecidableInstances i get no complaints and the compiler hangs. See thishttp://paste.pocoo.org/show/95523/. Thus, i can find no observable difference for this flag in this particular code sample. Best wishes, --greg On Mon, Dec 15, 2008

Re: [Haskell-cafe] Re: haskell compiler never comes back

2008-12-15 Thread Greg Meredith
PM, Daniel Fischer daniel.is.fisc...@web.dewrote: Am Montag, 15. Dezember 2008 23:16 schrieb Greg Meredith: Haskellians, An even simpler version http://paste.pocoo.org/show/95518/ that reveals the issue. i'm astounded that the compiler literally just hangs. Best wishes, --greg

Re: [Haskell-cafe] Re: haskell compiler never comes back

2008-12-15 Thread Greg Meredith
Daniel, BTW, if i comment out the version of PutIn that calls HF{L,R}Val and put in the unit, instead, i see the complaint you're seeing. i'll upgrade ghc. Best wishes, --greg On Mon, Dec 15, 2008 at 2:49 PM, Greg Meredith lgreg.mered...@biosimilarity.com wrote: Daniel, Thanks. i'm using

Re: [Haskell-cafe] haskell compiler never comes back

2008-12-16 Thread Greg Meredith
at 12:23:08PM -0800, Greg Meredith wrote: The simple-minded and smallish code sample at this linkhttp://paste.pocoo.org/show/95503/causes the compiler to go off into never-never land. Any clues would be greatly appreciated. I've lost track of this thread, but if you still think there's

[Haskell-cafe] Re: how would Albus Dumbledore sell Haskell

2007-04-20 Thread Greg Meredith
Simon, Regarding Justin Bailey's idea of a calculator -- here's a twist. There is some sample Haskell code of Conway's account of numbers as games floating around the internet (http://www.dcs.ed.ac.uk/home/pgh/conway.html, http://www.dcs.ed.ac.uk/home/pgh/Conway.lhs). i can't vouch for the code

[Haskell-cafe] Re: haskell question

2007-04-20 Thread Greg Meredith
On 4/20/07, [EMAIL PROTECTED] [EMAIL PROTECTED] wrote: Greg Meredith wrote: The file compiles with ghc as is. If you uncomment the last section, however, you see that to close the loop on the constraints for the agent syntax we hit a typing error. i bithink/i/b this is a hard constraint

[Haskell-cafe] Re: haskell question

2007-04-23 Thread Greg Meredith
Oleg, Many thanks. i also found some course notes from Advance Functional Programming at Utrecht very useful. i have to wait until i have quality time to go over this because the next step is to close the final loop to find the fix point of - Process = Process(Nominate(Process)) i haven't

[Haskell-cafe] On reflection

2007-04-24 Thread Greg Meredith
Oleg, Simon, Thanks for your help. If i understand it correctly, the code below gives a reasonably clean first cut at a demonstration of process calculi as polymorphically parametric in the type of name, allowing for an instantiation of the type in which the quoted processes play the role of

[Haskell-cafe] efficient and/or lazy partitions of a multiset

2007-05-21 Thread Greg Meredith
HC-er's, Find below some simple-minded code from a naive Haskeller for generating all partitions of a multiset about which i have two questions. mSplit :: [a] - [([a], [a])] mSplit [x] = [([x],[])] mSplit (x:xs) = (zip (map (x:) lxs) rxs) ++ (zip lxs (map (x:) rxs))

[Haskell-cafe] Re: efficient and/or lazy partitions of a multiset

2007-05-22 Thread Greg Meredith
in quite a bit faster that the comprehension based example. Best wishes, --greg On 5/21/07, Greg Meredith [EMAIL PROTECTED] wrote: HC-er's, Find below some simple-minded code from a naive Haskeller for generating all partitions of a multiset about which i have two questions. mSplit

Re: [Haskell-cafe] Re: efficient and/or lazy partitions of a multiset

2007-05-23 Thread Greg Meredith
Henning, i need the bi-partitions of a multiset. That is, all the ways you can split a multiset, M, into two multisets, M1 and M2, such that M = M1 `multiset-union` M2. Best wishes, --greg On 5/23/07, Henning Thielemann [EMAIL PROTECTED] wrote: On Tue, 22 May 2007, Greg Meredith wrote

[Haskell-cafe] Monads and constraint satisfaction problems (CSP)

2007-05-31 Thread Greg Meredith
All, All this talk about Mathematica and a reference to monadic treatments of backtracking reminded me that a year ago i was involved in work on a Mathematica-like widget. At the time i noticed that a good deal of the structure underlying LP, SAT and other solvers was terribly reminiscent of

[Haskell-cafe] Re: Monads and constraint satisfaction problems (CSP)

2007-05-31 Thread Greg Meredith
: [Haskell-cafe] Monads and constraint satisfaction problems (CSP) To: Greg Meredith [EMAIL PROTECTED] Cc: haskell-cafe haskell-cafe@haskell.org Message-ID: [EMAIL PROTECTED] Content-Type: text/plain; charset=US-ASCII At Thu, 31 May 2007 10:42:57 -0700, Greg Meredith wrote: BTW, i think this could

[Haskell-cafe] Java Monads?

2007-06-04 Thread Greg Meredith
HaskellyCaffeinated, i noticed that there was a JavaMonad lib kicking around on the web, but all the links i can find are stale. Does anybody have a live pointer to this lib? Best wishes, --greg -- L.G. Meredith Managing Partner Biosimilarity LLC 505 N 72nd St Seattle, WA 98103 +1

[Haskell-cafe] copy-on-write monad?

2007-06-22 Thread Greg Meredith
Fellow Functionally-Caffeinated, i have a few questions regarding copy-on-write semantics. i am working for a client that is stuck with a legacy in-house language that chose copy-on-write as a way to provide aliasing-issue-free semantics to a user population they perceived as not sophisticated

[Haskell-cafe] Re: copy-on-write monad?

2007-06-24 Thread Greg Meredith
-- is actually more natural. Best wishes, --greg On 6/23/07, [EMAIL PROTECTED] [EMAIL PROTECTED] wrote: Greg Meredith wrote: First, has anyone worked out a monadic approach to copy-on-write? (And, Is there any analysis of perf characteristics of said monadic schemes?) If you use Zippers (Huet's

[Haskell-cafe] let vs do?

2007-06-28 Thread Greg Meredith
Haskellians, Once you have a polymorphic let, why do you need 'let' in the base language, at all? Is it possible to formulate Haskell entirely with do-notation where there is a standard monad for let environments? Probably this was all discussed before in the design deliberations for the

Re: [Haskell-cafe] let vs do?

2007-06-28 Thread Greg Meredith
Thomas, Thanks for the reply. My thinking was that once you have a polymorphic form, why single out any other? Less moving parts makes for less maintenance, etc. Best wishes, --greg On 6/28/07, Thomas Schilling [EMAIL PROTECTED] wrote: On 28 jun 2007, at 21.17, Greg Meredith wrote: Once

Re: [Haskell-cafe] let vs do?

2007-06-29 Thread Greg Meredith
Thomas, Stefan, Thanks for a most edifying exchange! i will reflect on this. Best wishes, --greg On 6/28/07, Stefan Holdermans [EMAIL PROTECTED] wrote: Thomas, let x = ... in ... is only equal do x - ...; ... in the Identity monad. Also, why would do be more primitive than

[Haskell-cafe] monads and groups -- instead of loops

2007-08-01 Thread Greg Meredith
Haskellians, Though the actual metaphor in the monads-via-loops doesn't seem to fly with this audience, i like the spirit of the communication and the implicit challenge: find a pithy slogan that -- for a particular audience, like imperative programmers -- serves to uncover the essence of the

Re: [Haskell-cafe] monads and groups -- instead of loops

2007-08-01 Thread Greg Meredith
programmer happens to be one of the 90% of programmers that isn't particularly familiar with group theory... On 8/1/07, Greg Meredith [EMAIL PROTECTED] wrote: Haskellians, Though the actual metaphor in the monads-via-loops doesn't seem to fly with this audience, i like the spirit

[Haskell-cafe] Re: monads and groups -- instead of loops

2007-08-01 Thread Greg Meredith
generally useful to computing in situation where boxing and updating have natural (or yet to be discovered) candidates for undo operations. i'm given to understand reversible computing might be a good thing to be thinking about if QC ever gets real... ;-) Best wishes, --greg On 8/1/07, Greg Meredith

[Haskell-cafe] Re: monads and groups -- instead of loops

2007-08-02 Thread Greg Meredith
] Content-Type: text/plain;charset=iso-8859-1 Math alert: mild category theory. Greg Meredith wrote: But, along these lines i have been wondering for a while... the monad laws present an alternative categorification of monoid. At least it's alternative to monoidoid. I wouldn't call

Re: RE [Haskell-cafe] Monad Description For Imperative

2007-08-03 Thread Greg Meredith
Haskellians, i am delighted to see vigorous exchange that actually resulted in change of positions. i confess i was going to give up, but glad others stepped into the breach. This is yet another indication of what an unusual community this is. Best wishes, --greg Date: Fri, 3 Aug 2007 13:43:32

[Haskell-cafe] towards a new foundation for set theory with atoms

2007-08-10 Thread Greg Meredith
Haskellians, i have a particular interest in FM-set theory in that it simplifies a host of otherwise non-trivial aspects of programming language semantics, especially, fresh names. You can provide semantics without sets with atoms, but the functor category machinery is more than a little on the

[Haskell-cafe] Re: towards a new foundation for set theory with atoms

2007-08-10 Thread Greg Meredith
the structure and simplify the code. Perhaps someone better versed in the Haskellian mysteries could enlighten me. Best wishes, --greg On 8/10/07, Greg Meredith [EMAIL PROTECTED] wrote: Haskellians, i have a particular interest in FM-set theory in that it simplifies a host of otherwise non-trivial

Re: [Haskell-cafe] Re: towards a new foundation for set theory with atoms

2007-08-12 Thread Greg Meredith
Brandon, Cool. Well spotted. i was thinking a lot about the symmetry in the type space as a kind of group. i'll play around with your suggestion. Best wishes, --greg On 8/11/07, Brandon Michael Moore [EMAIL PROTECTED] wrote: On Fri, Aug 10, 2007 at 03:54:23PM -0700, Greg Meredith wrote

[Haskell-cafe] 3 applications of indexed composition as a language design principle

2009-01-16 Thread Greg Meredith
Haskellians, i've found a way to generalize the LogicT transformer and calculated it's application to three fairly interesting examples. The approach -- with some sample codes as scala+lift web apps -- is described

[Haskell-cafe] Fwd: C9 video in the Monadic Design Patterns for the Web series

2011-07-27 Thread Greg Meredith
in the Monadic Design Patterns for the Web series To: Meredith Gregory lgreg.mered...@gmail.com Cc: Brian Beckman ... And we’re live! ** ** http://channel9.msdn.com/Shows/Going+Deep/C9-Lectures-Greg-Meredith-Monadic-Design-Patterns-for-the-Web-4-of-n C ** ** *From:* Charles Torre

Re: [Haskell-cafe] Fwd: C9 video in the Monadic Design Patterns for the Web series

2011-07-27 Thread Greg Meredith
)) mzero) R x = f = R (bind liftM x (runR . f)) On Jul 27, 2011, at 4:31 AM, Greg Meredith wrote: Dear Haskellians, A new C9 video in the series! So, you folks already know most of this... except for maybe the generalization of the Conway construction! Best wishes, --greg

[Haskell-cafe] Contract opportunity with Biosimilarity LLC

2011-07-28 Thread Greg Meredith
Dear Haskellians, No desire to spam, but some folks on this list might find this of interest. Best wishes, --greg Biosimilarity LLC is looking for a the next Merlin! We need an artiste with a certain taste and technical instinct that have attracted them to next generation functional

[Haskell-cafe] Monadic Design Patterns for the Web Chapter Review

2012-02-25 Thread Greg Meredith
*Dear Supporters, Friends and Colleagues, i’m writing to you to say that i will be going over the material in Chapters 3 through 9 of the book, MDP4tW in a Google+ hangout, 1 Chapter / week. If any would like to participate in reviewing the material presented, please let me know. i will limit