compiler/tests/PPCUniversalTest.st
changeset 464 f6d77fee9811
child 504 0fb1f0799fc1
child 515 b5316ef15274
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/compiler/tests/PPCUniversalTest.st	Thu May 21 14:12:22 2015 +0100
@@ -0,0 +1,579 @@
+"{ Package: 'stx:goodies/petitparser/compiler/tests' }"
+
+"{ NameSpace: Smalltalk }"
+
+PPAbstractParserTest subclass:#PPCUniversalTest
+	instanceVariableNames:'parser result context node compiler id node2 id2 id1 node1 node3
+		arguments configuration'
+	classVariableNames:''
+	poolDictionaries:''
+	category:'PetitCompiler-Tests-Core-Universal'
+!
+
+!PPCUniversalTest methodsFor:'context'!
+
+context	
+    ^ context := PPCProfilingContext new
+! !
+
+!PPCUniversalTest methodsFor:'test support'!
+
+assert: p parse: whatever
+    ^ result := super assert: p parse: whatever.
+!
+
+parse: whatever
+    ^ result := super parse: whatever.
+!
+
+tearDown
+    | parserClass |
+
+    parserClass := (Smalltalk at: arguments name ifAbsent: [nil]).
+    parserClass notNil ifTrue:[ 
+        parserClass removeFromSystem
+    ].
+! !
+
+!PPCUniversalTest methodsFor:'tests - compiling'!
+
+testCompileAnd
+    parser := #digit asParser and compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '1' to: $1 end: 0.
+    self assert: parser fail: 'a'.
+    self assert: parser fail: ''.
+
+    parser := ('foo' asParser, ($: asParser and)) compile.
+    self assert: parser parse: 'foo:' to: { 'foo'. $: } end: 3.
+!
+
+testCompileAny
+    parser := #any asParser compile.
+    
+    self assert: parser parse: 'a' to: $a.
+    self assert: parser parse: '_' to: $_.
+    self assert: parser parse: '
+' to: Character cr.
+!
+
+testCompileAnyStar
+    parser := #any asParser star compileWithConfiguration: configuration.
+    
+    
+    self assert: parser parse: 'aaa' to: { $a. $a . $a }.
+    self assert: context invocationCount = 1.
+    self assert: parser parse: '' to: { }.	
+!
+
+testCompileBlock
+    parser := (#letter asParser) plus ==> [ :res | res collect: [:each | each asUppercase ]].
+    parser := parser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: { $F . $O . $O}.
+    self assert: parser parse: 'bar' to: { $B . $A . $R}.
+    self assert: parser fail: ''.
+!
+
+testCompileCharacter
+    parser := $a asParser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'a'  to: $a.
+    self assert: parser fail: 'b'.
+
+    parser := $# asParser compileWithConfiguration: configuration.
+    self assert: parser parse: '#'.
+!
+
+testCompileChoice
+    parser := (#digit asParser / #letter asParser) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '1' to: $1.
+    self assert: parser parse: 'a' to: $a.
+    self assert: parser fail: '_'.
+    
+!
+
+testCompileChoice2
+    parser := ('true' asParser / 'false' asParser) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'true' to: 'true'.
+    self assert: parser parse: 'false' to: 'false'.
+    self assert: parser fail: 'trulse'.
+    
+!
+
+testCompileLiteral
+    parser := 'foo' asParser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo'  to: 'foo'.
+    self assert: parser parse: 'foobar'  to: 'foo' end: 3.
+    self assert: parser fail: 'boo'.
+    
+    parser := '#[' asParser compileWithConfiguration: configuration.
+    self assert: parser parse: '#[1]' to: '#[' end: 2.
+!
+
+testCompileLiteral2
+    | quote |
+    quote := '''' asParser.
+    parser := (quote, $a asParser ) compileWithConfiguration: configuration.	
+    self assert: parser parse: '''a'  to: {'''' . $a}.	
+!
+
+testCompileNegate
+    parser := #letter asParser negate star, #letter asParser.
+    parser := parser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '...a' to: { { $. . $. . $. } . $a }.
+    self assert: parser parse: 'aaa' to: { {} . $a } end: 1.
+    self assert: parser fail: '...'.
+!
+
+testCompileNil
+    parser := nil asParser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'a' to: nil end: 0.
+    self assert: parser parse: '' to: nil end: 0.
+    
+    parser := nil asParser, 'foo' asParser.
+    self assert: parser parse: 'foo' to: { nil . 'foo' }
+!
+
+testCompileNot
+    parser := #digit asParser not compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'a' to: nil end: 0.
+    self assert: parser fail: '1'.
+    self assert: parser parse: '' to: nil end: 0.
+
+    parser := 'foo' asParser, $: asParser not.
+    parser := parser compileWithConfiguration: configuration.	
+    self assert: parser parse: 'foo' to: { 'foo'. nil } end: 3.
+    
+    parser := 'foo' asParser, $: asParser not, 'bar' asParser.
+    parser := parser compileWithConfiguration: configuration.	
+    self assert: parser parse: 'foobar' to: { 'foo'. nil . 'bar' } end: 6.
+!
+
+testCompileNot2
+    parser := ($a asParser, $b asParser) not compileWithConfiguration: configuration.
+        
+    self assert: parser parse: '' to: nil end: 0.
+    self assert: parser parse: 'a' to: nil end: 0.
+    self assert: parser parse: 'aa' to: nil end: 0.
+    self assert: parser fail: 'ab'.
+!
+
+testCompileNot3
+    parser := ('foo' asParser not, 'fee' asParser) compileWithConfiguration: configuration.
+        
+    self assert: parser parse: 'fee' to: #(nil 'fee').
+    self assert: parser fail: 'foo'.
+!
+
+testCompileNotLiteral
+    parser := 'foo' asParser not compileWithConfiguration: configuration.
+    self assert: parser class methodDictionary size = 1.
+
+    self assert: parser parse: 'bar' to: nil end: 0.
+        
+    self assert: parser fail: 'foo'.
+    self assert: parser parse: '' to: nil end: 0.
+
+    parser := '''' asParser not compile.
+    self assert: parser class methodDictionary size = 1.
+
+    self assert: parser parse: 'a' to: nil end: 0.
+    self assert: parser fail: ''''.
+    self assert: parser parse: '' to: nil end: 0.
+
+
+    parser := ('foo' asParser, 'bar' asParser not) compile.
+    self assert: parser parse: 'foofoo' to: { 'foo'. nil } end: 3.
+    
+    parser := ('foo' asParser, 'foo' asParser not, #any asParser star) compile.
+    self assert: parser parse: 'foobar' to: { 'foo'. nil . #($b $a $r) } end: 6.
+    self assert: parser fail: 'foofoo'.
+!
+
+testCompileOptional
+    parser := #digit asParser optional compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '1' to: $1.
+    self assert: parser parse: 'a' to: nil end: 0.
+    
+    parser := (#digit asParser optional, #letter asParser) compile.
+    self assert: parser parse: '1a' to: { $1 . $a }.
+    self assert: parser parse: 'a' to: { nil . $a }.
+!
+
+testCompilePlus
+    parser := #letter asParser plus compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'lorem' to: {$l. $o. $r. $e. $m} .
+    self assert: parser parse: 'a123' to: {$a} end: 1.
+    self assert: parser parse: 'ab123' to: {$a . $b} end: 2.
+
+    self assert: parser fail: ''.
+    self assert: parser fail: '123'.
+!
+
+testCompilePredicate
+    parser := #digit asParser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '1' to: $1.
+    self assert: parser parse: '0' to: $0.
+    self assert: parser fail: 'a'.
+!
+
+testCompilePredicate2
+    parser := #space asParser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: ' ' to: Character space.
+    self assert: parser fail: 'a'.
+!
+
+testCompileSequence
+    parser := (#digit asParser, #letter asParser) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '1a' to: {$1 .$a}.
+    
+    
+!
+
+testCompileSequence2
+    parser := (#digit asParser, #space asParser, #letter asParser) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: '9 c' to: {$9 . Character space. $c }.	
+    self assert: parser fail: '9c'.
+    
+!
+
+testCompileSequence3
+    parser := (#any asParser, #any asParser, #any asParser) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: #($f $o $o).	
+    self assert: parser fail: 'fo'.
+    
+!
+
+testCompileStar
+    parser := #letter asParser star compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'lorem' to: {$l. $o. $r. $e. $m} .
+    self assert: parser parse: '' to: {}.
+    self assert: parser parse: '123' to: {} end: 0.
+    self assert: parser parse: 'ab123' to: {$a . $b} end: 2.
+!
+
+testCompileStarLiteral
+    parser := 'foo' asParser star compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: #('foo' ) .
+    self assert: parser parse: 'foofoo' to: #('foo' 'foo') .
+    self assert: parser parse: 'foofoofoo' to: #('foo' 'foo' 'foo') .
+    self assert: parser parse: '' to: #().
+    self assert: parser parse: 'bar' to: #() end: 0.
+!
+
+testCompileStarPredicate
+    parser := #letter asParser star compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: #($f $o $o ) .
+    self assert: parser parse: '' to: #().
+    self assert: parser parse: '123' to: #() end: 0.
+!
+
+testCompileSymbolBlock
+    parser := (#letter asParser) plus ==> #second.
+    parser := parser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: $o.
+    self assert: parser parse: 'bar' to: $a.
+    self assert: parser fail: ''.
+    self should: [ parser parse: 'f' ] raise: Error.
+!
+
+testCompileTrim
+    parser := $a asParser trim compileWithConfiguration: configuration.
+    
+    self assert: parser fail: ''.
+    self assert: parser parse: 'a' to: $a.
+    self assert: parser parse: '   a' to: $a.
+    self assert: parser parse: 'a    ' to: $a.
+    self assert: parser parse: '  a    ' to: $a.
+!
+
+testCompileTrimmingToken
+    | token1 token2 |
+    token1 := (#letter asParser) plus trimmingToken.
+    token2 := (#letter asParser) plus trimmingToken.
+    
+    parser := (token1, token2) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo bar'.
+    self assert: parser parse: ' foo bar '.
+!
+
+testCompileTrimmingToken2
+    | token1 token2 |
+    token1 := (#letter asParser) plus trimmingToken.
+    token2 := (#letter asParser) plus trimmingToken / 'foo' asParser trimmingToken.
+    
+    parser := (token1, token2) compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo bar'.
+    self assert: parser parse: ' foo bar '.
+!
+
+testCompileTrimmingToken3
+    | token1 token2 |
+    token1 := ($a asParser, $b asParser) trimmingToken name: 'token1'.
+    token2 := (token1 not, $c asParser) trimmingToken name: 'token2'.
+    
+    parser := (token1 / token2) compileWithConfiguration: configuration.
+
+    self assert: (parser class methodDictionary includesKey: #'token1').
+    self assert: (parser class methodDictionary includesKey: #'token1_fast').
+    
+    self assert: parser parse: 'ab'.
+    self assert: (result isKindOf: PPToken).
+    self assert: result inputValue = 'ab'.
+
+    self assert: parser parse: 'c'.
+    self assert: (result isKindOf: PPToken).
+    self assert: result inputValue = 'c'.
+    
+! !
+
+!PPCUniversalTest methodsFor:'tests - extra'!
+
+testCompileSmalltalkToken
+    parser := (#letter asParser, ((#letter asParser / #digit asParser) star)) smalltalkToken compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+    self assert: parser parse: 'a'.
+    self assert: result inputValue = 'a'.
+    self assert: parser parse: 'f123a'.
+    self assert: result inputValue = 'f123a'.
+    
+    self assert: parser fail: ''.
+    self assert: parser fail: '12'.
+
+    self assert: parser parse: ' "comment" foo'.
+    self assert: result inputValue = 'foo'.
+    
+    self assert: parser parse: ' "comment" bar "another comment" '.
+    self assert: result inputValue = 'bar'.
+    self assert: parser parse: '
+        "b"
+        "b"
+        foo
+        "and yet, another comment"
+
+        "one more to make sure :)"
+    '.
+    self assert: result inputValue = 'foo'.
+!
+
+testCycle
+    | p1 block |
+    
+    p1 := PPDelegateParser new.
+    block := ${ asParser, p1, $} asParser / nil asParser.
+    p1 setParser: block.
+    
+    parser := block compileWithConfiguration: configuration.
+    self assert: parser parse: '{}' to: { ${. nil . $} }.
+    self assert: parser parse: '{{}}' to: { ${. { ${ . nil . $} } . $} }.
+    
+!
+
+testSmalltalkToken
+    parser := (#letter asParser, (#digit asParser / #letter asParser) star) smalltalkToken compileWithConfiguration: configuration.
+    
+    self assert: parser class methodDictionary size = 5.
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+    self assert: context invocationCount = 8.
+    self assert: context rememberCount = 0.
+    self assert: context lwRememberCount = 0.
+    self assert: context lwRestoreCount = 0.	
+!
+
+testSmalltalkToken2
+    id := (#letter asParser, (#digit asParser / #letter asParser) star)
+        name: 'identifier';
+        yourself.
+        
+    parser := (id wrapped, $: asParser) smalltalkToken 
+        name: 'kw';
+        yourself.
+    
+    parser := parser compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo:'.
+    self assert: result inputValue = 'foo:'.
+!
+
+testToken
+    parser := (#letter asParser, (#digit asParser / #letter asParser) star) flatten compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo' to: 'foo'.
+    self assert: parser parse: 'a' to: 'a'.
+    self assert: parser parse: 'f123a' to: 'f123a'.
+    self assert: parser fail: ''.
+!
+
+testToken2
+    parser := (#letter asParser, (#digit asParser / #letter asParser) star) token compileWithConfiguration: configuration.
+    
+    self assert: parser class methodDictionary size = 4.
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+    self assert: context invocationCount = 6.
+    self assert: context rememberCount = 0.
+    self assert: context lwRememberCount = 0.
+    self assert: context lwRestoreCount = 0.	
+!
+
+testTrimmingToken
+    parser := (#letter asParser, (#digit asParser / #letter asParser) star) trimmingToken compileWithConfiguration: configuration.
+
+    self assert: parser class methodDictionary size = 4.
+
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+
+    self assert: context invocationCount = 6.
+    self assert: context rememberCount = 0.
+    self assert: context lwRememberCount = 0.
+    self assert: context lwRestoreCount = 0.	
+
+    self assert: parser parse: ' foo '.
+    self assert: result inputValue = 'foo'.
+
+
+
+    self assert: parser fail: '123'.
+
+    self assert: context invocationCount = 1.
+    self assert: context rememberCount = 0.
+    self assert: context lwRememberCount = 0.
+    self assert: context lwRestoreCount = 0.	
+
+
+    self assert: parser fail: ''.
+!
+
+testTrimmingToken2
+
+    parser := 'foo' asParser trimmingToken, 'bar' asParser trimmingToken
+        compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foobar'.
+    self assert: result first inputValue = 'foo'.
+    self assert: result second inputValue = 'bar'.	
+    self assert: context invocationCount = 3.
+
+    self assert: parser parse: ' foobar'.
+    self assert: result first inputValue = 'foo'.
+    self assert: result second inputValue = 'bar'.	
+    self assert: context invocationCount = 3.
+    self assert: (context invocations anySatisfy: [ :e | e beginsWith: 'token' ]).	
+        
+    self assert: parser fail: 'bar'.
+    self assert: context invocationCount = 2.
+"	self assert: (context invocations noneSatisfy: [ :e | e beginsWith: 'token' ]).	"
+    
+!
+
+testTrimmingToken3
+
+    parser := ('foo' asParser trimmingToken / 'bar' asParser trimmingToken)
+        compileWithConfiguration: configuration.
+    
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+    self assert: context invocationCount = 2.
+
+    self assert: parser parse: ' bar'.
+    self assert: result inputValue = 'bar'.	
+    self assert: context invocationCount = 2.
+    self assert: (context invocations anySatisfy: [ :e | e beginsWith: 'token' ]).	
+        
+    self assert: parser fail: 'baz'.
+    self assert: context invocationCount = 2.
+    
+    self assert: parser fail: 'zaz'.
+    self assert: context invocationCount = 1.
+    self assert: (context invocations noneSatisfy: [ :e | e beginsWith: 'token' ]).	
+!
+
+testTrimmingTokenNested
+    | identifier kw |
+    kw := 'false' asParser trimmingToken name: #kw.
+    identifier := (kw not, (#letter asParser, #word asParser star)) trimmingToken name: #identifier.
+    
+    parser := identifier / kw.
+    parser := parser compileWithConfiguration: configuration.
+    self assert: parser class methodDictionary size = 5.
+
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+
+    self assert: parser parse: 'false'.
+    self assert: result inputValue = 'false'.
+!
+
+testTrimmingTokenNested2
+    | identifier kw |
+    kw := 'false' asParser trimmingToken name: #kw.
+    identifier := (kw not, (#letter asParser, #word asParser star)) trimmingToken name: #identifier.
+    
+    parser := identifier / kw.
+    parser := parser compileWithConfiguration: configuration.
+    self assert: parser class methodDictionary size = 5.
+
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+
+    self assert: parser parse: 'false'.
+    self assert: result inputValue = 'false'.
+!
+
+testTrimmingTokenNested3
+    | identifier kw |
+    kw := ('false' asParser, #word asParser not) trimmingToken name: #kw.
+    identifier := (kw not, (#letter asParser, #word asParser star)) trimmingToken name: #identifier.
+    
+    parser := identifier / kw.
+    parser := parser compileWithConfiguration: configuration.
+    self assert: parser class methodDictionary size = 8.
+    self assert: (parser class methodDictionary values anySatisfy: [ :m | m selector = #kw ]).
+    self assert: (parser class methodDictionary values anySatisfy: [ :m | m selector = #kw_fast ]).
+
+    self assert: parser parse: 'foo'.
+    self assert: result inputValue = 'foo'.
+
+    self assert: parser parse: 'false'.
+    self assert: result inputValue = 'false'.
+
+    "Modified: / 10-05-2015 / 07:33:19 / Jan Vrany <jan.vrany@fit.cvut.cz>"
+! !
+
+!PPCUniversalTest methodsFor:'tests - ids'!
+
+setUp
+    arguments := PPCArguments default
+        profile: true;
+        debug: true;
+        yourself.
+        
+    configuration := PPCUniversalConfiguration new
+        arguments: arguments;
+        yourself.
+! !
+