Re: [Pharo-project] about DateAndTime =

2010-04-24 Thread Stéphane Ducasse

On Apr 23, 2010, at 10:25 PM, Henrik Johansen wrote:

 It's still wrong though, in that it is not symmetric...
 
 Due to the isKindOf: self class test, and
 =  not being reimplemented in Timestamp (DateAndTime subclass), so Timestamp 
 to DateAndTime comparitions will fail:
 
 aDateandTime = anEquivalentTimestamp true
 anEquivalentTimestamp = aDateAndTime false
 
 There's a test for you! :D

:)

Stef

 
 Cheers,
 Henry
 
 On Apr 23, 2010, at 10:01 30PM, Stéphane Ducasse wrote:
 
 Thanks
 
 Chris about the speed what do you compare?
 using accessors to access month/date or something else.
 This is not clear to me.
 
 On Apr 23, 2010, at 9:49 PM, Chris Muller wrote:
 
 In case anyone cares, Brent and I have been working together
 professionally for the last couple of years.  Brent, we have been
 running with that method modified since 2007 to not do that
 conversion.  We have not sufferred any ill-effects from it.  Check our
 vanilla image:
 
 DateAndTime#= comparand
 comparand conforms to protocol DateAndTime,
 or can be converted into something that conforms.
 | comparandAsDateAndTime |
 self == comparand ifTrue: [ ^ true ].
 (comparand isKindOf: self class) ifFalse: [ ^ false ].
 [ comparandAsDateAndTime := comparand asDateAndTime ]
 on: MessageNotUnderstood
 do: [ ^ false ].
 ^ self offset = comparandAsDateAndTime offset
 ifTrue: [ self hasEqualTicks: comparandAsDateAndTime ]
 ifFalse: [ self asUTC ticks = comparandAsDateAndTime asUTC 
 ticks ]
 
 I agree with Stef on this.  Not only is it confusing to me, it is
 inconsistent with other type-checks.  But the primary reason I
 overrode it back in 2007 was for better performance.  Try benching the
 above against the stock comparison...
 
 - Chris
 
 On Fri, Apr 23, 2010 at 2:26 PM, Brent Pinkney br...@zamail.co.za wrote:
 On Friday 23 April 2010 21:12:03 Stéphane Ducasse wrote:
 Hi all
 
 I'm trying to fix some tests and I do not like the behavior of DateAndTime
 = Comparing aDateAndTime and a something tries to convert the something in
 a dateAndTime automagically. I find that not really good because it hides
 potential problem: manipulating string instead of objects.
 
 So I would like to have
 (aDateAndTime offset: '0:12:00:00') =  '1901-01-01T00:00:00+12:00' -
 false (aDateAndTime offset: '0:12:00:00') asString =
 '1901-01-01T00:00:00+12:00' - true.
 
 What do you think.
 
 Hi,
 
 I wrote that code, and it is needed to compare DateAndTimes with Timespans 
 - eg Month, Year, Date...
 Please tread carefully - lots of production code relies on that.
 
 Already my (DateAndTime now != DateAndTime now)  have been removed :(
 
 Thanks
 
 Brent
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] about DateAndTime =

2010-04-24 Thread Stéphane Ducasse
it will be :)

http://code.google.com/p/pharo/issues/detail?id=2348

On Apr 23, 2010, at 11:18 PM, Brent Pinkney wrote:

 What is Timestamp?
 
 A legacy class that has a Date and a TIme object.
 Predates ANSI DateAndTime.
 
 Should be purged IMHO.
 
 Brent
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] about DateAndTime =

2010-04-24 Thread Stéphane Ducasse
Indeed this would be good to fold TimeStamp in its superclass.
I was not aware of this situation but now we will fix it.
May be some care is needed to keep the nice printout of TimeStamp.
If you have some pharo code send it.

Stef

On Apr 23, 2010, at 11:36 PM, Chris Muller wrote:

 Hi Stef, I will help on the Squeak side.  I suppose I could work on
 that symmetry with Timestamp, but I'd rather talk about removing
 Timestamp instead first..  It doesn't really seem like we need two
 time-stamp classes, do we?
 
 
 
 On Fri, Apr 23, 2010 at 3:06 PM, Stéphane Ducasse
 stephane.duca...@inria.fr wrote:
 I'm turning this into tests!
 Brent if you want to help fixing let me know.
 I will focus now on the parsing problem.
 
 Stef
 
 On Apr 23, 2010, at 9:51 PM, Nicolas Cellier wrote:
 
 2010/4/23 Stéphane Ducasse stephane.duca...@inria.fr:
 Hi all
 
 I'm trying to fix some tests and I do not like the behavior of DateAndTime 
 =
 Comparing aDateAndTime and a something tries to convert the something in a 
 dateAndTime automagically.
 I find that not really good because it hides potential problem: 
 manipulating string instead of objects.
 
 So I would like to have
   (aDateAndTime offset: '0:12:00:00') =  '1901-01-01T00:00:00+12:00' 
 - false
   (aDateAndTime offset: '0:12:00:00') asString =  
 '1901-01-01T00:00:00+12:00' - true.
 
 What do you think.
 
 
 I would expect this for =
 1) Reflexive
   self assert: x = x.
 2) Symmetric
   self assert: (x = y) = (y = x).
 3) Transitive
   self assert: (x = y)  (y = z) == (x = z).
 
 I guess equality with a String at least breaks 2).
 
 Nicolas
 
 
 Stef
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Marcus Denker

On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:

 Stef,
 
 I will soon reach a point of missing a way to do callbacks.  Alien/FFI is 
 listed among the goals, and I would very much like to see that happen, 
 especially if callbacks are well supported as a result.
 

But what we should *not* do is to delay the release for that. Releases should 
be a snapshot of what is already done. 1.1 *as it is now* (minus bugs) is 
already a huge step
forward. If we delay that to make it even better, we will again delay the 
release for a looong time. 

I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it. There will 
be a 1.2 anyway. 

Marcus



--
Marcus Denker  -- http://www.marcusdenker.de
INRIA Lille -- Nord Europe. Team RMoD.


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Stéphane Ducasse
ok but this is still good to know what we could wrap up.
Now I'm fixing some tests if somebody wants to help there are some problems on 
weak structures.

Stef
On Apr 24, 2010, at 10:31 AM, Marcus Denker wrote:

 
 On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:
 
 Stef,
 
 I will soon reach a point of missing a way to do callbacks.  Alien/FFI is 
 listed among the goals, and I would very much like to see that happen, 
 especially if callbacks are well supported as a result.
 
 
 But what we should *not* do is to delay the release for that. Releases should 
 be a snapshot of what is already done. 1.1 *as it is now* (minus bugs) is 
 already a huge step
 forward. If we delay that to make it even better, we will again delay the 
 release for a looong time. 
 
 I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it. There 
 will be a 1.2 anyway. 
 
   Marcus
 
 
 
 --
 Marcus Denker  -- http://www.marcusdenker.de
 INRIA Lille -- Nord Europe. Team RMoD.
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


[Pharo-project] Change Window Size

2010-04-24 Thread Lukas Renggli
I am trying to change the window size in a headless build script on
Linux, so that when I open the image on my Mac it appears bigger.

DisplayScreen depth: DisplayScreen actualScreenDepth width: 1920
height: 1032 fullscreen: false

There is no change though. Any other ideas on how to change the
default VM window size?

Lukas

-- 
Lukas Renggli
www.lukas-renggli.ch

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


[Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread stephane ducasse
Hi 

What are the expectation for DateAndTimereadFrom?

On squeak such tests do not pass. 

testReadFromFoolProofExtension
Convenient extension without a time, only a date
self debug: #testReadFromFoolProofExtension

self assert: ('2008' asDateAndTime printString = 
'2008-01-01T00:00:00+00:00').
self assert: ('2008-08' asDateAndTime printString = 
'2008-08-01T00:00:00+00:00').
self assert: ('2006-08-28' asDateAndTime printString = 
'2006-08-28T00:00:00+00:00').
Regular nanoseconds
self assert: ('2006-08-28T00:00:00.123456789' asDateAndTime printString 
= '2006-08-28T00:00:00.123456789+00:00').
Extra picoseconds precision should not spoil the DateAndTime
self assert: ('2006-08-28T00:00:00.123456789000' asDateAndTime 
printString = '2006-08-28T00:00:00.123456789+00:00').



in Pharo
DateAndTimerreadFrom: aStream
| bc year month day hour minute second nanos offset buffer ch |


aStream peek = $- ifTrue: [ aStream next. bc := -1] ifFalse: [bc := 1].
year := (aStream upTo: $-) asInteger * bc.
month := (aStream upTo: $-) asInteger ifNil: [1].
day := (aStream upTo: $T) asInteger ifNil: [1].
hour := (aStream upTo: $:) asInteger ifNil: [0].
buffer := '00:' copy. ch := nil.
minute := buffer writeStream.
[ aStream atEnd | (ch = $:) | (ch = $+) | (ch = $-) ]
whileFalse: [ ch := minute nextPut: aStream next. ].
(ch isNil or: [ch isDigit]) ifTrue: [ ch := $: ].
minute := (buffer readStream upTo: ch) asInteger.
buffer := '00.' copy.
second := buffer writeStream.
[ aStream atEnd | (ch = $.) | (ch = $+) | (ch = $-) ]
whileFalse: [ ch := second nextPut: aStream next. ].
(ch isNil or: [ch isDigit]) ifTrue: [ ch := $. ].
second := (buffer readStream upTo: ch) asInteger.
buffer := '0' copy.
(ch = $.) ifTrue: [ 
nanos := buffer writeStream.
[ aStream atEnd | ((ch := aStream next) = $+) | (ch = $-) ]
whileFalse: [ nanos nextPut: ch. ].
(ch isNil or: [ch isDigit]) ifTrue: [ ch := $+ ].
].

nanos := buffer asInteger.
aStream atEnd
ifTrue: [ offset := Duration zero ]
ifFalse: [ch := aStream next.
   ch = $+ ifTrue: [ch := Character space].
   offset := Duration fromString: ch asString, '0:', 
aStream upToEnd, ':0'].
^ self
year: year
month: month
day: day
hour: hour
minute: minute

second: second
nanoSecond:  nanos

offset: offset.

It loosk a bit ugly and crashed on some inputs


 In Squeak they have code that looks cleaner
readFrom: aStream

| offset date time ch |

date := Date readFrom: aStream.
[aStream peek isDigit]
whileFalse: [aStream next].
time := Time readFrom: aStream.
aStream atEnd
ifTrue: [ offset := Duration zero ]
ifFalse: [
ch := aStream next.
ch = $+ ifTrue: [ch := Character space].
offset := Duration fromString: ch asString, '0:', 
aStream upToEnd, ':0'].

^ self
year: date year
month: date monthIndex
day: date dayOfMonth
hour: time hour
minute: time minute
second: time second
nanoSecond: time nanoSecond
offset: offset





Date

For Date we have 
readFrom: aStream 
readFrom: pattern: 

Read a Date from the stream in any of the forms:  
day month year(15 April 1982; 15-APR-82; 
15.4.82; 15APR82)  
month day year(April 15, 1982; 4/15/82)


Squeak has a better one
readFrom: pattern: 

Read a Date from the stream in any of the forms:  
day month year(15 April 1982; 15-APR-82; 
15.4.82; 15APR82)  
month day year(April 15, 1982; 4/15/82)
year-month-day(1982-04-15) (ISO8601)

I like the idea to have a readFrom: that is parsing a specific input and that 
the variations are handled in separate methods.

So for DateAndTime we coudl have
fuzzyReadFrom: aStream or something like that.






Duration
==
Now for Duration readFrom: 
the pattern is strictly followed 
Formatted as per ANSI 5.8.2.16: [-]D:HH:MM:SS[.S]

In pharo it was bogus. So I was considering the one of Squeak, which looks 
cleaner.

Pharo broke 

Re: [Pharo-project] Change Window Size

2010-04-24 Thread Stéphane Ducasse
did you check if this is not controlled by the info.plist?

Stef

On Apr 24, 2010, at 11:38 AM, Lukas Renggli wrote:

 I am trying to change the window size in a headless build script on
 Linux, so that when I open the image on my Mac it appears bigger.
 
DisplayScreen depth: DisplayScreen actualScreenDepth width: 1920
 height: 1032 fullscreen: false
 
 There is no change though. Any other ideas on how to change the
 default VM window size?
 
 Lukas
 
 -- 
 Lukas Renggli
 www.lukas-renggli.ch
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Change Window Size

2010-04-24 Thread Lukas Renggli
No, there is no such setting.

The window size seems to somehow depend on the Display bitmap.

Lukas

On 24 April 2010 12:37, Stéphane Ducasse stephane.duca...@inria.fr wrote:
 did you check if this is not controlled by the info.plist?

 Stef

 On Apr 24, 2010, at 11:38 AM, Lukas Renggli wrote:

 I am trying to change the window size in a headless build script on
 Linux, so that when I open the image on my Mac it appears bigger.

    DisplayScreen depth: DisplayScreen actualScreenDepth width: 1920
 height: 1032 fullscreen: false

 There is no change though. Any other ideas on how to change the
 default VM window size?

 Lukas

 --
 Lukas Renggli
 www.lukas-renggli.ch

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project




-- 
Lukas Renggli
www.lukas-renggli.ch

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


[Pharo-project] [update 1.1] #11321

2010-04-24 Thread stephane ducasse

11321
-

- Fixing Duration, Date, DateAndTime, Time readFrom:
- Issue 1202: Mantis 6764 Duration class#readFrom: bug


Stef

There are still some bugs to squash 

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


[Pharo-project] bug looking for hunter

2010-04-24 Thread stephane ducasse
Hi guys

I have to fix my house :) so I could not continue to kill this one on Unstable 
11321

'-1199-01-05T20:33:14.321-05:00' asDateAndTime printString 
-  '-1199-01-05T20:33:(14321/1000).321-05:00'

STef
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Change Window Size

2010-04-24 Thread John M McIntosh
http://wiki.squeak.org/squeak/3862

 HostWindowPlugin  primitiveHostWindowSizeSet:x:y:

might work on other platforms than the mac,  your milage and support may vary. 

On 2010-04-24, at 5:08 AM, Lukas Renggli wrote:

 No, there is no such setting.
 
 The window size seems to somehow depend on the Display bitmap.
 
 Lukas
 
 On 24 April 2010 12:37, Stéphane Ducasse stephane.duca...@inria.fr wrote:
 did you check if this is not controlled by the info.plist?
 
 Stef
 
 On Apr 24, 2010, at 11:38 AM, Lukas Renggli wrote:
 
 I am trying to change the window size in a headless build script on
 Linux, so that when I open the image on my Mac it appears bigger.
 
DisplayScreen depth: DisplayScreen actualScreenDepth width: 1920
 height: 1032 fullscreen: false
 
 There is no change though. Any other ideas on how to change the
 default VM window size?
 
 Lukas
 
 --
 Lukas Renggli
 www.lukas-renggli.ch
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 
 
 -- 
 Lukas Renggli
 www.lukas-renggli.ch
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

--
===
John M. McIntosh john...@smalltalkconsulting.com   Twitter:  squeaker68882
Corporate Smalltalk Consulting Ltd.  http://www.smalltalkconsulting.com
===






smime.p7s
Description: S/MIME cryptographic signature
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Stéphane Ducasse
Ok when do we code freeze 1.1?

mid may?

Stef

 
 On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:
 
 Stef,
 
 I will soon reach a point of missing a way to do callbacks.  Alien/FFI is 
 listed among the goals, and I would very much like to see that happen, 
 especially if callbacks are well supported as a result.
 
 
 But what we should *not* do is to delay the release for that. Releases should 
 be a snapshot of what is already done. 1.1 *as it is now* (minus bugs) is 
 already a huge step
 forward. If we delay that to make it even better, we will again delay the 
 release for a looong time. 
 
 I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it. There 
 will be a 1.2 anyway. 
 
   Marcus
 
 
 
 --
 Marcus Denker  -- http://www.marcusdenker.de
 INRIA Lille -- Nord Europe. Team RMoD.
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] [ANN] Metacello configuration of OSProcess

2010-04-24 Thread Germán Arduino
I find today this mail, because I needed today OSProcess.

I need to execute a Unix command and parse the results, then I think I
need CommandShell, but when try to install it
from Squeaksource it requires   PluggableTextController   PluggableTextView.

In what package they are? (I'm using Pharo 1.0 to this development).

Thanks
Germán.


El día 13 de enero de 2010 18:52, Miguel Enrique Cobá Martinez
miguel.c...@gmail.com escribió:
 Hi all,

 I have published the ConfigurationOfOSProcess in the MetacelloRepository
 of squeaksource.
 With this you can load OSProcess and its tests in PharoCore.

 Just evaluate in a workspace:

 Gofer it
  squeaksource: 'MetacelloRepository';
  package: 'ConfigurationOfOSProcess';
  load.

 Then evaluate

 ((Smalltalk at: #ConfigurationOfOSProcess) project version: '4.3.11')
 load.

 to load just the OSProcess, or:

 ((Smalltalk at: #ConfigurationOfOSProcess) project version: '4.3.11')
 load: 'Tests'.

 to load OSProcess and their tests.

 Tested in PharoCore 10506

 Enjoy!
 --
 Miguel Cobá
 http://miguel.leugim.com.mx


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Change Window Size

2010-04-24 Thread Lukas Renggli
Thanks for the pointer, the following code works for me:

 HostWindowProxy basicNew primitiveWindowSize: 1 x: 1024 y: 786

The handle 1 seems to be the main window, don't know if this is always the case?

Lukas

2010/4/24 John M McIntosh john...@smalltalkconsulting.com:
 http://wiki.squeak.org/squeak/3862

  HostWindowPlugin  primitiveHostWindowSizeSet:x:y:

 might work on other platforms than the mac,  your milage and support may vary.

 On 2010-04-24, at 5:08 AM, Lukas Renggli wrote:

 No, there is no such setting.

 The window size seems to somehow depend on the Display bitmap.

 Lukas

 On 24 April 2010 12:37, Stéphane Ducasse stephane.duca...@inria.fr wrote:
 did you check if this is not controlled by the info.plist?

 Stef

 On Apr 24, 2010, at 11:38 AM, Lukas Renggli wrote:

 I am trying to change the window size in a headless build script on
 Linux, so that when I open the image on my Mac it appears bigger.

    DisplayScreen depth: DisplayScreen actualScreenDepth width: 1920
 height: 1032 fullscreen: false

 There is no change though. Any other ideas on how to change the
 default VM window size?

 Lukas

 --
 Lukas Renggli
 www.lukas-renggli.ch

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project




 --
 Lukas Renggli
 www.lukas-renggli.ch

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

 --
 ===
 John M. McIntosh john...@smalltalkconsulting.com   Twitter:  squeaker68882
 Corporate Smalltalk Consulting Ltd.  http://www.smalltalkconsulting.com
 ===





 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project




-- 
Lukas Renggli
www.lukas-renggli.ch

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] [ANN] Metacello configuration of OSProcess

2010-04-24 Thread Germán Arduino
Forgot the question, I found a mail from David (subject:  OSProcess
question) explaining about
the broken Morphic interface.

Thanks.

2010/4/24 Germán Arduino gardu...@gmail.com:
 I find today this mail, because I needed today OSProcess.

 I need to execute a Unix command and parse the results, then I think I
 need CommandShell, but when try to install it
 from Squeaksource it requires   PluggableTextController   PluggableTextView.

 In what package they are? (I'm using Pharo 1.0 to this development).

 Thanks
 Germán.


 El día 13 de enero de 2010 18:52, Miguel Enrique Cobá Martinez
 miguel.c...@gmail.com escribió:
 Hi all,

 I have published the ConfigurationOfOSProcess in the MetacelloRepository
 of squeaksource.
 With this you can load OSProcess and its tests in PharoCore.

 Just evaluate in a workspace:

 Gofer it
  squeaksource: 'MetacelloRepository';
  package: 'ConfigurationOfOSProcess';
  load.

 Then evaluate

 ((Smalltalk at: #ConfigurationOfOSProcess) project version: '4.3.11')
 load.

 to load just the OSProcess, or:

 ((Smalltalk at: #ConfigurationOfOSProcess) project version: '4.3.11')
 load: 'Tests'.

 to load OSProcess and their tests.

 Tested in PharoCore 10506

 Enjoy!
 --
 Miguel Cobá
 http://miguel.leugim.com.mx


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] (Duration seconds: 73994 nanoSeconds: 321000000) seconds

2010-04-24 Thread Stéphane Ducasse
http://code.google.com/p/pharo/issues/detail?id=2352

I proposed a fix and would loved to have feedback.

Stef

On Apr 24, 2010, at 7:51 PM, Stéphane Ducasse wrote:

 the problem seems to be due to 
   (Duration seconds: 73994 nanoSeconds: 32100) seconds 
   which returns a fraction
 
 
 In pharo
 
 Durationseconds
   Answer the number of seconds the receiver represents.
 
   ^ (seconds rem: SecondsInMinute) + (nanos / NanosInSecond)
 
 
 In Squeakseconds
   Answer the number of seconds the receiver represents.
 
   ^seconds rem: SecondsInMinute
 
 
 Now I have the impression that the squeak version is right
 
 What do you think?
 
 Stef
 
 
 On Apr 24, 2010, at 4:38 PM, stephane ducasse wrote:
 
 Hi guys
 
 I have to fix my house :) so I could not continue to kill this one on 
 Unstable 11321
 
 '-1199-01-05T20:33:14.321-05:00' asDateAndTime printString 
  -  '-1199-01-05T20:33:(14321/1000).321-05:00'
 
 STef
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] FEATURE: User chooses preferred location for MC directory repositories

2010-04-24 Thread David T. Lewis
Yes, the expression OSProcess thisOSProcess environment works on
Windows, Mac and Unix/Linux, provided that you have loaded package
OSProcess and have the OSProcessPlugin. On Windows you have to build
your own OSProcessPlugin.

Dave

On Thu, Apr 22, 2010 at 04:25:10PM -0300, csra...@bol.com.br wrote:
 Provided you install some specific package, right?
 
 Em 21/04/2010 11:14, Chris Muller  asquea...@gmail.com  escreveu:
 Environment variables can be interrogated, at least in Linux (perhaps
 other OS's, I haven't tried), via OSProcess:
 
  OSProcess thisOSProcess environment
 
 Hope that helps..
 
 On Tue, Apr 20, 2010 at 4:21 PM, Michael Roberts  wrote:
  i'm not sure what either of you mean. I want there to be no UI choice
  and the system just looks higher up in the file system hierarchy.
 
  certainly environment variables or a .pharorc style file would solve this.
 
  thanks,
  Mike
 

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread Julian Fitzell
On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse stephane.duca...@free.fr
 wrote:

 What are the expectation for DateAndTimereadFrom?


Personally, my expectation is that it doesn't exist. :)

To believe that there is a single way of parsing strings into dates (or
numbers, or anything else) that will be appropriate in all cases is pretty
silly. It would seem much better to me to have configurable parsing classes.

Julian
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread Nicolas Cellier
2010/4/24 Julian Fitzell jfitz...@gmail.com:
 On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse
 stephane.duca...@free.fr wrote:

 What are the expectation for DateAndTimereadFrom?

 Personally, my expectation is that it doesn't exist. :)

 To believe that there is a single way of parsing strings into dates (or
 numbers, or anything else) that will be appropriate in all cases is pretty
 silly. It would seem much better to me to have configurable parsing classes.

 Julian


Sure, that might be usefull, however current implementation intention
clearly seems related to
 http://en.wikipedia.org/wiki/ISO_8601

Nicolas

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread Stéphane Ducasse
yes but before having that and all the complexity it can bring I suggest to 
stick with a non fuzzy and customizable 
parser that does not exist yet and stick to ISO format and parse only this one 
but well.

Stef

On Apr 24, 2010, at 9:16 PM, Julian Fitzell wrote:

 On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse stephane.duca...@free.fr 
 wrote:
 What are the expectation for DateAndTimereadFrom?
 
 Personally, my expectation is that it doesn't exist. :)
 
 To believe that there is a single way of parsing strings into dates (or 
 numbers, or anything else) that will be appropriate in all cases is pretty 
 silly. It would seem much better to me to have configurable parsing classes.
 
 Julian 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread Stéphane Ducasse
What I did was to stick with the ISO parsing and added a fuzzy readfrom (the 
previous one in pharo)
so that readFrom: read only iso but well and fuzzy tries to find its way with 
strange input.

Stef

On Apr 24, 2010, at 9:48 PM, Nicolas Cellier wrote:

 2010/4/24 Julian Fitzell jfitz...@gmail.com:
 On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse
 stephane.duca...@free.fr wrote:
 
 What are the expectation for DateAndTimereadFrom?
 
 Personally, my expectation is that it doesn't exist. :)
 
 To believe that there is a single way of parsing strings into dates (or
 numbers, or anything else) that will be appropriate in all cases is pretty
 silly. It would seem much better to me to have configurable parsing classes.
 
 Julian
 
 
 Sure, that might be usefull, however current implementation intention
 clearly seems related to
 http://en.wikipedia.org/wiki/ISO_8601
 
 Nicolas
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] (Duration seconds: 73994 nanoSeconds: 321000000) seconds

2010-04-24 Thread Alexandre Bergel

I commented on the website of google.

Alexandre


On 24 Apr 2010, at 13:59, Stéphane Ducasse wrote:


http://code.google.com/p/pharo/issues/detail?id=2352

I proposed a fix and would loved to have feedback.

Stef

On Apr 24, 2010, at 7:51 PM, Stéphane Ducasse wrote:


the problem seems to be due to
(Duration seconds: 73994 nanoSeconds: 32100) seconds
which returns a fraction


In pharo

Durationseconds
Answer the number of seconds the receiver represents.

^ (seconds rem: SecondsInMinute) + (nanos / NanosInSecond)


In Squeakseconds
Answer the number of seconds the receiver represents.

^seconds rem: SecondsInMinute


Now I have the impression that the squeak version is right

What do you think?

Stef


On Apr 24, 2010, at 4:38 PM, stephane ducasse wrote:


Hi guys

I have to fix my house :) so I could not continue to kill this one  
on Unstable 11321


'-1199-01-05T20:33:14.321-05:00' asDateAndTime printString
-  '-1199-01-05T20:33:(14321/1000).321-05:00'

STef
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project



___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project



___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


--
_,.;:~^~:;._,.;:~^~:;._,.;:~^~:;._,.;:~^~:;._,.;:
Alexandre Bergel  http://www.bergel.eu
^~:;._,.;:~^~:;._,.;:~^~:;._,.;:~^~:;._,.;:~^~:;.






___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Schwab,Wilhelm K
Stef,

What do you mean by weak structures?  Weak collections?

Bill 



 

-Original Message-
From: pharo-project-boun...@lists.gforge.inria.fr 
[mailto:pharo-project-boun...@lists.gforge.inria.fr] On Behalf Of Stéphane 
Ducasse
Sent: Saturday, April 24, 2010 3:58 AM
To: Pharo-project@lists.gforge.inria.fr
Subject: Re: [Pharo-project] starting to think about 1.1 freeze

ok but this is still good to know what we could wrap up.
Now I'm fixing some tests if somebody wants to help there are some problems on 
weak structures.

Stef
On Apr 24, 2010, at 10:31 AM, Marcus Denker wrote:

 
 On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:
 
 Stef,
 
 I will soon reach a point of missing a way to do callbacks.  Alien/FFI is 
 listed among the goals, and I would very much like to see that happen, 
 especially if callbacks are well supported as a result.
 
 
 But what we should *not* do is to delay the release for that. Releases 
 should be a snapshot of what is already done. 1.1 *as it is now* (minus bugs) 
 is already a huge step forward. If we delay that to make it even better, we 
 will again delay the release for a looong time.
 
 I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it. There 
 will be a 1.2 anyway. 
 
   Marcus
 
 
 
 --
 Marcus Denker  -- http://www.marcusdenker.de INRIA Lille -- Nord 
 Europe. Team RMoD.
 
 
 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Henrik Johansen

WeakKeyDictionary, to be specific.
To be frank, to me the new implementation in 1.1 seems simply broken.

Cheers,
Henry

Den 24. apr. 2010 kl. 22.58 skrev Schwab,Wilhelm K bsch...@anest.ufl.edu 
:



Stef,

What do you mean by weak structures?  Weak collections?

Bill





-Original Message-
From: pharo-project-boun...@lists.gforge.inria.fr [mailto:pharo- 
project-boun...@lists.gforge.inria.fr] On Behalf Of Stéphane Ducasse

Sent: Saturday, April 24, 2010 3:58 AM
To: Pharo-project@lists.gforge.inria.fr
Subject: Re: [Pharo-project] starting to think about 1.1 freeze

ok but this is still good to know what we could wrap up.
Now I'm fixing some tests if somebody wants to help there are some  
problems on weak structures.


Stef
On Apr 24, 2010, at 10:31 AM, Marcus Denker wrote:



On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:


Stef,

I will soon reach a point of missing a way to do callbacks.  Alien/ 
FFI is listed among the goals, and I would very much like to see  
that happen, especially if callbacks are well supported as a result.




But what we should *not* do is to delay the release for that.  
Releases
should be a snapshot of what is already done. 1.1 *as it is now*  
(minus bugs) is already a huge step forward. If we delay that to  
make it even better, we will again delay the release for a looong  
time.


I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it.  
There will be a 1.2 anyway.


   Marcus



--
Marcus Denker  -- http://www.marcusdenker.de INRIA Lille -- Nord
Europe. Team RMoD.


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project



___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project



___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Re: [Pharo-project] starting to think about 1.1 freeze

2010-04-24 Thread Schwab,Wilhelm K
Not to be inflammatory, the weak collections have been broken all along.  They 
are not thread safe, and so cannot hope to be adequately cleaned as objects are 
finalized.  My efforts to compensate have been aimed at clearing away nils that 
are left behind.  If the weak collection itself is busted (holds too 
strongly??), then my additions are not going to help.

Bill



-Original Message-
From: pharo-project-boun...@lists.gforge.inria.fr 
[mailto:pharo-project-boun...@lists.gforge.inria.fr] On Behalf Of Henrik 
Johansen
Sent: Saturday, April 24, 2010 5:07 PM
To: Pharo-project@lists.gforge.inria.fr
Subject: Re: [Pharo-project] starting to think about 1.1 freeze

WeakKeyDictionary, to be specific.
To be frank, to me the new implementation in 1.1 seems simply broken.

Cheers,
Henry

Den 24. apr. 2010 kl. 22.58 skrev Schwab,Wilhelm K bsch...@anest.ufl.edu
 :

 Stef,

 What do you mean by weak structures?  Weak collections?

 Bill





 -Original Message-
 From: pharo-project-boun...@lists.gforge.inria.fr [mailto:pharo- 
 project-boun...@lists.gforge.inria.fr] On Behalf Of Stéphane Ducasse
 Sent: Saturday, April 24, 2010 3:58 AM
 To: Pharo-project@lists.gforge.inria.fr
 Subject: Re: [Pharo-project] starting to think about 1.1 freeze

 ok but this is still good to know what we could wrap up.
 Now I'm fixing some tests if somebody wants to help there are some 
 problems on weak structures.

 Stef
 On Apr 24, 2010, at 10:31 AM, Marcus Denker wrote:


 On Apr 23, 2010, at 8:30 PM, Schwab,Wilhelm K wrote:

 Stef,

 I will soon reach a point of missing a way to do callbacks.  Alien/ 
 FFI is listed among the goals, and I would very much like to see 
 that happen, especially if callbacks are well supported as a result.


 But what we should *not* do is to delay the release for that.  
 Releases
 should be a snapshot of what is already done. 1.1 *as it is now* 
 (minus bugs) is already a huge step forward. If we delay that to make 
 it even better, we will again delay the release for a looong time.

 I vote for just defininf 1.1 as what 1.1 is *now* and stabilize it.  
 There will be a 1.2 anyway.

Marcus



 --
 Marcus Denker  -- http://www.marcusdenker.de INRIA Lille -- Nord 
 Europe. Team RMoD.


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


[Pharo-project] saving headless image on Mac

2010-04-24 Thread Tudor Girba

Hi,

I am trying to integrate a Pharo image into a continuous integration  
system through the command line. For that I need to spawn the image,  
do something, save and quit.


The problem is that on Mac (using 4.2.2beta1U), when I open the  
resulting image I get a very tiny window instead of the original size.


The command below reveals the problem (save-and-quite-image.st is  
attached):


/Applications/Squeak4.2.2beta1U/Squeak\ 4.2.2beta1U.app/Contents/MacOS/ 
Squeak\ VM\ Opt -headless Pharo-1.0.image THE_PATH/save-and-quit- 
image.st


Could anyone advise me how to proceed to get around this problem?

Cheers,
Doru

--
www.tudorgirba.com

Every thing has its own flow.




save-and-quit-image.st
Description: Binary data
___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread csrabak

Then a more appropriate class would be ISO8601DateAndTime for this method to 
remain in Pharo?

--
Cesar Rabak


Em 24/04/2010 16:48, Nicolas Cellier  nicolas.cellier.aka.n...@gmail.com  
escreveu:
2010/4/24 Julian Fitzell :
 On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse
  wrote:

 What are the expectation for DateAndTimereadFrom?

 Personally, my expectation is that it doesn't exist. :)

 To believe that there is a single way of parsing strings into dates (or
 numbers, or anything else) that will be appropriate in all cases is pretty
 silly. It would seem much better to me to have configurable parsing classes.

 Julian


Sure, that might be usefull, however current implementation intention
clearly seems related to
 http://en.wikipedia.org/wiki/ISO_8601

Nicolas

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project



___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


Re: [Pharo-project] Expectation for readFrom:... getting bored to fix bugs.

2010-04-24 Thread Igor Stasenko
imo, it should look like:

readFrom: stream
  ^ readFrom: stream pattern: ISO8601

and
readFrom:pattern:

should parse date by taking an arbitrary pattern into account.
We could invent own syntax for a pattern, or use other invented ones
(from C, Perl etc),
and implement a separate DateTimeParser class.

The messy code like this
   aStream peek = $- ifTrue: [ aStream next. bc := -1] ifFalse: [bc := 1].
   year := (aStream upTo: $-) asInteger * bc.
   month := (aStream upTo: $-) asInteger ifNil: [1].
   day := (aStream upTo: $T) asInteger ifNil: [1].
   hour := (aStream upTo: $:) asInteger ifNil: [0].

should be put in trash! :)

On 24 April 2010 23:05, Stéphane Ducasse stephane.duca...@inria.fr wrote:
 What I did was to stick with the ISO parsing and added a fuzzy readfrom (the 
 previous one in pharo)
 so that readFrom: read only iso but well and fuzzy tries to find its way with 
 strange input.

 Stef

 On Apr 24, 2010, at 9:48 PM, Nicolas Cellier wrote:

 2010/4/24 Julian Fitzell jfitz...@gmail.com:
 On Sat, Apr 24, 2010 at 10:54 AM, stephane ducasse
 stephane.duca...@free.fr wrote:

 What are the expectation for DateAndTimereadFrom?

 Personally, my expectation is that it doesn't exist. :)

 To believe that there is a single way of parsing strings into dates (or
 numbers, or anything else) that will be appropriate in all cases is pretty
 silly. It would seem much better to me to have configurable parsing classes.

 Julian


 Sure, that might be usefull, however current implementation intention
 clearly seems related to
 http://en.wikipedia.org/wiki/ISO_8601

 Nicolas

 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


 ___
 Pharo-project mailing list
 Pharo-project@lists.gforge.inria.fr
 http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project




-- 
Best regards,
Igor Stasenko AKA sig.

___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Re: [Pharo-project] saving headless image on Mac

2010-04-24 Thread Yanni Chiu

Tudor Girba wrote:

Hi,

I am trying to integrate a Pharo image into a continuous integration 
system through the command line. For that I need to spawn the image, do 
something, save and quit.


The problem is that on Mac (using 4.2.2beta1U), when I open the 
resulting image I get a very tiny window instead of the original size.


This has been bothering me for a long time, and Lukas' recent thread on 
 Change Window Size pushed me to take a look at it. I found out, just 
like you, that just the save-and-quit would result in the tiny window.


The command below reveals the problem (save-and-quite-image.st is 
attached):


/Applications/Squeak4.2.2beta1U/Squeak\ 
4.2.2beta1U.app/Contents/MacOS/Squeak\ VM\ Opt -headless Pharo-1.0.image 
THE_PATH/save-and-quit-image.st


Could anyone advise me how to proceed to get around this problem?


Since you're on a Mac, could you add a final fix-up step that runs the 
vm without the -headless option, sets the window size, then runs 
save-and-quit.


I added:

HostWindowProxy basicNew primitiveWindowSize: 1 x: 1024 y: 786.

before the save and quit code. I used another build.sh script that 
skipped the -headless option, and ran the script. As expected, the 
Pharo window popped up briefly. In the end, I finally have an image that 
opens up with a reasonable size.


--
Yanni


___
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project