[Pharo-project] broken gettext package in 1.4

2012-03-15 Thread Hilaire Fernandes
I have this code below from Gettext package becoming broken with latest
Ring Pharo 1.4 package.

Can someone with the appropriate knowledge help me there?

Problem occurs at (Smalltalk at: methodReference classSymbol)

methodReference is a RGMethodDefinition


Enclosed PharoDebug.log

appendStringReceivers: aSymbol into: domains
| literals references domainName methodReference keywords found |

found := TranslatedReceiverFinder new stringReceiversWithContext: 
aSymbol.
found do: [ :assoc |
methodReference := assoc key.
keywords := assoc value.
domainName := self getTextDomainForClassCategory:
(Smalltalk at: methodReference classSymbol) category.
literals := domains at: domainName ifAbsentPut: [Dictionary 
new].
keywords do: [ :literal |
references := literals at: literal ifAbsentPut: 
[OrderedCollection new].
references add: methodReference.
].
].



-- 
Dr. Geo -- http://www.drgeo.eu
THERE_BE_DRAGONS_HERE
KeyNotFound: key #'AbstractFont class' not found in SystemDictionary
14 March 2012 9:41:29 pm

VM: unix - i686 - linux - nil, nil, nil
Image: Pharo1.4a [Latest update: #14367]

SystemDictionary(Dictionary)errorKeyNotFound:
	Receiver: a SystemDictionary(lots of globals)
	Arguments and temporary variables: 
		aKey: 	#'AbstractFont class'
	Receiver's instance variables: 
		tally: 	2526
		array: 	an Array(nil nil #KoreanEnvironment-KoreanEnvironment #MultiCharacterSc...etc...
		cachedClassNames: 	an OrderedCollection(#AColorSelectorMorph #Abort #AboutDialog...etc...
		cachedNonClassNames: 	an OrderedCollection(#ActiveEvent #ActiveHand #ActiveWorld...etc...


[self errorKeyNotFound: key] in SystemDictionary(Dictionary)at:
	Receiver: a SystemDictionary(lots of globals)
	Arguments and temporary variables: 
		key: 	#'AbstractFont class'
	Receiver's instance variables: 
		tally: 	2526
		array: 	an Array(nil nil #KoreanEnvironment-KoreanEnvironment #MultiCharacterSc...etc...
		cachedClassNames: 	an OrderedCollection(#AColorSelectorMorph #Abort #AboutDialog...etc...
		cachedNonClassNames: 	an OrderedCollection(#ActiveEvent #ActiveHand #ActiveWorld...etc...


SystemDictionary(Dictionary)at:ifAbsent:
	Receiver: a SystemDictionary(lots of globals)
	Arguments and temporary variables: 
		key: 	#'AbstractFont class'
		aBlock: 	[self errorKeyNotFound: key]
		assoc: 	nil
	Receiver's instance variables: 
		tally: 	2526
		array: 	an Array(nil nil #KoreanEnvironment-KoreanEnvironment #MultiCharacterSc...etc...
		cachedClassNames: 	an OrderedCollection(#AColorSelectorMorph #Abort #AboutDialog...etc...
		cachedNonClassNames: 	an OrderedCollection(#ActiveEvent #ActiveHand #ActiveWorld...etc...


SystemDictionary(Dictionary)at:
	Receiver: a SystemDictionary(lots of globals)
	Arguments and temporary variables: 
		key: 	#'AbstractFont class'
	Receiver's instance variables: 
		tally: 	2526
		array: 	an Array(nil nil #KoreanEnvironment-KoreanEnvironment #MultiCharacterSc...etc...
		cachedClassNames: 	an OrderedCollection(#AColorSelectorMorph #Abort #AboutDialog...etc...
		cachedNonClassNames: 	an OrderedCollection(#ActiveEvent #ActiveHand #ActiveWorld...etc...


SmalltalkImageat:
	Receiver: Smalltalk
	Arguments and temporary variables: 
		aKey: 	#'AbstractFont class'
	Receiver's instance variables: 
		globals: 	a SystemDictionary(lots of globals)
		deferredStartupActions: 	nil


[:assoc | 
methodReference := assoc key.
	keywords := assoc value.
	domainName := self getTextDomainForClassCategory: (Smalltalk at: methodReference classSymbol) category.
	literals := domains
at: domainName
ifAbsentPut: [Dictionary new].
	keywords
		do: [:literal | 
			references := literals
		at: literal
		ifAbsentPut: [OrderedCollection new].
			references add: methodReference]] in GetTextExporterappendStringReceivers:into:
	Receiver: a GetTextExporter
	Arguments and temporary variables: 
error during printing
	Receiver's instance variables: 
		stream: 	nil


OrderedCollectiondo:
	Receiver: an OrderedCollection(AbstractFont classemphasisStringFor:-an OrderedCollection('Italic'...etc...
	Arguments and temporary variables: 
		aBlock: 	[:assoc | 
methodReference := assoc key.
	keywords := assoc value.
	dom...etc...
		index: 	1
	Receiver's instance variables: 
		array: 	an Array(AbstractFont classemphasisStringFor:-an OrderedCollection('I...etc...
		firstIndex: 	1
		lastIndex: 	659


GetTextExporterappendStringReceivers:into:
	Receiver: a GetTextExporter
	Arguments and temporary variables: 
error during printing
	Receiver's instance variables: 
		stream: 	nil


GetTextExporterappendTranslations:
	Receiver: a GetTextExporter
	Arguments and temporary variables: 
		domains: 	a Dictionary()
	Receiver's instance variables: 
		stream: 	nil


GetTextExporterexportTranslator:
	Receiver: a GetTextExporter
	Arguments and temporary variables: 
		

Re: [Pharo-project] broken gettext package in 1.4

2012-03-15 Thread Stéphane Ducasse

On Mar 14, 2012, at 9:43 PM, Hilaire Fernandes wrote:

 I have this code below from Gettext package becoming broken with latest
 Ring Pharo 1.4 package.
 
 Can someone with the appropriate knowledge help me there?
 
 Problem occurs at (Smalltalk at: methodReference classSymbol)
 
 methodReference is a RGMethodDefinition
 
 
 Enclosed PharoDebug.log
 
 appendStringReceivers: aSymbol into: domains
   | literals references domainName methodReference keywords found |
   
   found := TranslatedReceiverFinder new stringReceiversWithContext: 
 aSymbol.
   found do: [ :assoc |
   methodReference := assoc key.
   keywords := assoc value.
   domainName := self getTextDomainForClassCategory:
   (Smalltalk at: methodReference classSymbol) category.

methodReference realClass category?


   literals := domains at: domainName ifAbsentPut: [Dictionary 
 new].
   keywords do: [ :literal |
   references := literals at: literal ifAbsentPut: 
 [OrderedCollection new].
   references add: methodReference.
   ].
   ].
 
 
 
 -- 
 Dr. Geo -- http://www.drgeo.eu
 PharoDebug.log




Re: [Pharo-project] broken gettext package in 1.4

2012-03-15 Thread Hilaire Fernandes
Le 15/03/2012 16:58, Stéphane Ducasse a écrit :
  keywords := assoc value.
 domainName := self getTextDomainForClassCategory:
 (Smalltalk at: methodReference classSymbol) category.
   methodReference realClass category?
 
 


Yes something like that plus some other changes. I already forgot what I
did change.

-- 
Dr. Geo -- http://www.drgeo.eu