1
0
mirror of https://github.com/hsoft/collapseos.git synced 2024-11-02 06:30:55 +11:00

Compare commits

...

2 Commits

Author SHA1 Message Date
Virgil Dupras
863540f7c6 core: define H@ a bit sooner 2020-05-15 22:59:38 -04:00
Virgil Dupras
bd38d80f9c Move Cross-compiled core from B390 to B350
and renamed it "Core words". Also, reworded the presentation.
2020-05-15 22:44:49 -04:00
66 changed files with 269 additions and 271 deletions

View File

@ -5,7 +5,7 @@ MASTER INDEX
120 Linker 140 Addressed devices 120 Linker 140 Addressed devices
150 Extra words 150 Extra words
200 Z80 assembler 260 Cross compilation 200 Z80 assembler 260 Cross compilation
280 Z80 boot code 390 Cross-compiled core 280 Z80 boot code 350 Core words
490 TRS-80 Recipe 520 Fonts 490 TRS-80 Recipe 520 Fonts
550 TI-84+ Recipe 580 RC2014 Recipe 550 TI-84+ Recipe 580 RC2014 Recipe
620 Sega Master System Recipe 620 Sega Master System Recipe

16
blk/350 Normal file
View File

@ -0,0 +1,16 @@
Core words
This section contains arch-independent core words of Collapse
OS. Those words are written in a way that make them entirely
cross-compilable (see B260). When building Collapse OS, these
words come right after the boot binary (B280).
Because this unit is designed to be cross-compiled, things are
a little weird. It is compiling in the context of a full
Forth interpreter with all bells and whistles (and z80
assembler), but it has to obey strict rules:
1. Although it cannot compile a word that isn't defined yet,
it can still execute an immediate from the host system.
(cont.)

16
blk/351 Normal file
View File

@ -0,0 +1,16 @@
2. Immediate words that have been cross compiled *cannot* be
used. Only immediates from the host system can be used.
3. If an immediate word compiles words, it can only be words
that are part of the stable ABI.
All of this is because when cross compiling, all atom ref-
erences are offsetted to the target system and are thus
unusable directly. For the same reason, any reference to a word
in the host system will obviously be wrong in the target
system. More details in B260.
(cont.)

9
blk/352 Normal file
View File

@ -0,0 +1,9 @@
This unit is loaded in two "low" and "high" parts. The low part
is the biggest chunk and has the most definitions. The high
part is the "sensitive" chunk and contains "LITN", ":" and ";"
definitions which, once defined, kind of make any more defs
impossible.
The gap between these 2 parts is the ideal place to put device
driver code. Load the low part with "353 LOAD", the high part
with "380 LOAD"

13
blk/353 Normal file
View File

@ -0,0 +1,13 @@
: RAM+ [ RAMSTART LITN ] + ;
: BIN+ [ BIN( @ LITN ] + ;
: HERE 0x04 RAM+ ;
: CURRENT* 0x51 RAM+ ;
: CURRENT CURRENT* @ ;
: H@ HERE @ ;
: FIND ( w -- a f ) CURRENT @ SWAP _find ;
: QUIT
(resRS)
0 0x08 RAM+ ! ( 08 == C<* override )
LIT< (main) FIND DROP EXECUTE
;
1 25 LOADR+ ( xcomp core low )

12
blk/354 Normal file
View File

@ -0,0 +1,12 @@
: ABORT (resSP) QUIT ;
: ERR LIT< (print) FIND IF EXECUTE THEN ABORT ;
: = CMP NOT ; : < CMP -1 = ; : > CMP 1 = ;
: 0< 32767 > ; : >= < NOT ; : <= > NOT ; : 0>= 0< NOT ;
: >< ( n l h -- f ) 2 PICK > ( n l f ) ROT ROT > AND ;
: =><= 2 PICK >= ( n l f ) ROT ROT >= AND ;
: MIN ( n n - n ) 2DUP > IF SWAP THEN DROP ;
: MAX ( n n - n ) 2DUP < IF SWAP THEN DROP ;
: C@+ ( a -- a+1 c ) DUP C@ SWAP 1+ SWAP ;
: C!+ ( c a -- a+1 ) SWAP OVER C! 1+ ;
: C@- ( a -- a-1 c ) DUP C@ SWAP 1- SWAP ;
: C!- ( c a -- a-1 ) SWAP OVER C! 1- ;

View File

11
blk/356 Normal file
View File

@ -0,0 +1,11 @@
( parsed is tight, all comments ahead. We read the first char
outside of the loop because it *has* to be nonzero, which
means _pdacc *has* to return 0.
Then, we check for '-'. If we get it, we advance by one,
recurse and invert result.
We loop until _pdacc is nonzero, which means either WS or
non-digit. 1 means WS, which means parsing was a success.
-1 means non-digit, which means we have a non-decimal. )

16
blk/357 Normal file
View File

@ -0,0 +1,16 @@
: (parsed) ( a -- n f )
DUP C@ ( a c )
DUP '-' = IF
DROP 1+ ( a+1 ) (parsed) 0 ROT ( f 0 n )
- SWAP EXIT ( 0-n f )
THEN
0 SWAP _pdacc ( a r f )
DUP IF 2DROP 0 EXIT THEN
BEGIN ( a r 0 )
DROP SWAP 1+ ( r a+1 )
DUP C@ ( r a c )
ROT SWAP ( a r c )
_pdacc ( a r f )
DUP UNTIL
1 = ( a r f )
ROT DROP ( r f ) ;

11
blk/358 Normal file
View File

@ -0,0 +1,11 @@
( strings being sent to parse routines are always null
terminated )
: (parsec) ( a -- n f )
( apostrophe is ASCII 39 )
DUP C@ 39 = OVER 2+ C@ 39 = AND ( a f )
NOT IF 0 EXIT THEN ( a 0 )
( surrounded by apos, good, return )
1+ C@ 1 ( n 1 )
;

8
blk/359 Normal file
View File

@ -0,0 +1,8 @@
( returns negative value on error )
: _ ( c -- n )
DUP '0' '9' =><= IF '0' - EXIT THEN
DUP 'a' 'f' =><= IF 0x57 ( 'a' - 10 ) - EXIT THEN
DROP -1 ( bad )
;

15
blk/360 Normal file
View File

@ -0,0 +1,15 @@
: (parseh) ( a -- n f )
( '0': ASCII 0x30 'x': 0x78 0x7830: 30768 )
DUP @ 30768 = NOT IF 0 EXIT THEN ( a 0 )
( We have "0x" prefix )
2+
0 ( a r )
BEGIN
SWAP C@+ ( r a+1 c )
DUP NOT IF 2DROP 1 EXIT THEN ( r, 1 )
_ ( r a n )
DUP 0< IF ROT 2DROP 0 EXIT THEN ( a 0 )
ROT 16 * + ( a r*16+n )
AGAIN
;

View File

View File

View File

View File

@ -4,8 +4,8 @@
DUP NOT IF DROP 0x0c RAM+ @ THEN ( 0c == C<* ) DUP NOT IF DROP 0x0c RAM+ @ THEN ( 0c == C<* )
EXECUTE EXECUTE
; ;
: , HERE @ ! HERE @ 2+ HERE ! ; : , H@ ! H@ 2+ HERE ! ;
: C, HERE @ C! HERE @ 1+ HERE ! ; : C, H@ C! H@ 1+ HERE ! ;
: BIT@ ( bit addr -- f ) C@ SWAP RSHIFT 0x01 AND ; : BIT@ ( bit addr -- f ) C@ SWAP RSHIFT 0x01 AND ;
: BIT! ( f bit addr -- ) : BIT! ( f bit addr -- )
SWAP 0x01 SWAP LSHIFT ROT ( addr mask f ) SWAP 0x01 SWAP LSHIFT ROT ( addr mask f )

View File

View File

View File

10
blk/368 Normal file
View File

@ -0,0 +1,10 @@
: [entry] ( w -- )
H@ SWAP SCPY ( h )
H@ SWAP - ( sz )
( write prev value )
H@ CURRENT @ - ,
C, ( write size )
H@ CURRENT !
;
: (entry) WORD [entry] ;

View File

@ -1,7 +1,6 @@
( Words here until the end of the low part, unlike words ( Words here until the end of the low part, unlike words
preceeding them, aren't immediately needed for boot. But its preceeding them, aren't immediately needed for boot. But its
better to have as many words as possible in the xcomp part. ) better to have as many words as possible in the xcomp part. )
: H@ HERE @ ;
: IMMEDIATE : IMMEDIATE
CURRENT @ 1- CURRENT @ 1-
DUP C@ 128 OR SWAP C! ; DUP C@ 128 OR SWAP C! ;

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

View File

23
blk/390
View File

@ -1,14 +1,11 @@
Cross-compiled core ( Initializes the readln subsystem )
: RDLN$
H@ 0x32 ( IN(* ) RAM+ !
( plus 2 for extra bytes after buffer: 1 for
the last typed 0x0a and one for the following NULL. )
IN) IN( - ALLOT
(infl)
['] RDLN< 0x0c RAM+ !
1 0x06 RAM+ ! ( 06 == C<? )
;
This units contains core Collapse OS that are cross-compiled.
During building, these come right after the boot binary (B280).
Because this unit is designed to be cross-compiled, things are
a little weird. It is compiling in the context of a full
Forth interpreter with all bells and whistles (and z80
assembler), but it has to obey strict rules:
1. It cannot compile a word from higher layers. Immediates are
fine.
(cont.)

27
blk/391
View File

@ -1,16 +1,13 @@
2. Immediate words that have been cross compiled *cannot* be : .2 DUP 10 < IF SPC THEN . ;
used. Only immediates from the host system can be used. : EOL? ( c -- f ) DUP 0xd = SWAP NOT OR ;
3. If an immediate word compiles words, it can only be words : LIST
that are part of the stable ABI. BLK@
16 0 DO
I 1+ .2 SPC
64 I * BLK( + DUP 64 + SWAP DO
I C@ DUP EOL? IF DROP LEAVE ELSE EMIT THEN
LOOP
NL
LOOP
;
All of this is because when cross compiling, all atom ref-
erences are offsetted to the target system and are thus
unusable directly. For the same reason, any reference to a word
in the host system will obviously be wrong in the target
system. More details in B260.
(cont.)

24
blk/392
View File

@ -1,9 +1,15 @@
This unit is loaded in two "low" and "high" parts. The low part : INTERPRET
is the biggest chunk and has the most definitions. The high BEGIN
part is the "sensitive" chunk and contains "LITN", ":" and ";" WORD DUP C@ EOT? IF DROP EXIT THEN
definitions which, once defined, kind of make any more defs FIND NOT IF (parse) ELSE EXECUTE THEN
impossible. C<? NOT IF SPC LIT< ok (print) NL THEN
AGAIN ;
The gap between these 2 parts is the ideal place to put device ( Read from BOOT C< PTR and inc it. )
driver code. Load the low part with "393 LOAD", the high part : (boot<)
with "415 LOAD" ( 2e == BOOT C< PTR )
0x2e ( BOOT C< PTR ) RAM+ @ DUP C@ ( a c )
SWAP 1 + 0x2e RAM+ ! ( c ) ;
( pre-comment for tight LOAD: The 0x08==I check after INTERPRET
is to check whether we're restoring to "_", the word above.
if yes, then we're in a nested load. Also, the 1 in 0x06 is
to avoid tons of "ok" displays. )

31
blk/393
View File

@ -1,15 +1,16 @@
: RAM+ [ RAMSTART LITN ] + ; : LOAD
: BIN+ [ BIN( @ LITN ] + ; BLK> @ >R ( save restorable variables to RSP )
: HERE 0x04 RAM+ ; 0x08 RAM+ @ >R ( 08 == C<* override )
: CURRENT* 0x51 RAM+ ; 0x06 RAM+ @ >R ( C<? )
: CURRENT CURRENT* @ ; 0x2e RAM+ @ >R ( boot ptr )
BLK@
( w -- a f ) BLK( 0x2e RAM+ ! ( Point to beginning of BLK )
: FIND CURRENT @ SWAP _find ; ['] (boot<) 0x08 RAM+ !
1 0x06 RAM+ ! ( 06 == C<? )
: QUIT INTERPRET
(resRS) R> 0x2e RAM+ ! R> 0x06 RAM+ !
0 0x08 RAM+ ! ( 08 == C<* override ) I 0x08 RAM+ @ = IF ( nested load )
LIT< (main) FIND DROP EXECUTE R> DROP ( C<* ) R> BLK@
; ELSE ( not nested )
1 25 LOADR+ ( xcomp core low ) R> 0x08 RAM+ ! R> DROP ( BLK> )
THEN ;

16
blk/394
View File

@ -1,12 +1,4 @@
: ABORT (resSP) QUIT ; : LOAD+ BLK> @ + LOAD ;
: ERR LIT< (print) FIND IF EXECUTE THEN ABORT ; ( b1 b2 -- )
: = CMP NOT ; : < CMP -1 = ; : > CMP 1 = ; : LOADR 1+ SWAP DO I DUP . NL LOAD LOOP ;
: 0< 32767 > ; : >= < NOT ; : <= > NOT ; : 0>= 0< NOT ; : LOADR+ BLK> @ + SWAP BLK> @ + SWAP LOADR ;
: >< ( n l h -- f ) 2 PICK > ( n l f ) ROT ROT > AND ;
: =><= 2 PICK >= ( n l f ) ROT ROT >= AND ;
: MIN ( n n - n ) 2DUP > IF SWAP THEN DROP ;
: MAX ( n n - n ) 2DUP < IF SWAP THEN DROP ;
: C@+ ( a -- a+1 c ) DUP C@ SWAP 1+ SWAP ;
: C!+ ( c a -- a+1 ) SWAP OVER C! 1+ ;
: C@- ( a -- a-1 c ) DUP C@ SWAP 1- SWAP ;
: C!- ( c a -- a-1 ) SWAP OVER C! 1- ;

25
blk/396
View File

@ -1,11 +1,14 @@
( parsed is tight, all comments ahead. We read the first char : (main) INTERPRET BYE ;
outside of the loop because it *has* to be nonzero, which : BOOT
means _pdacc *has* to return 0. 0x02 RAM+ CURRENT* !
CURRENT @ 0x2e RAM+ ! ( 2e == BOOT C< PTR )
Then, we check for '-'. If we get it, we advance by one, 0 0x08 RAM+ ! ( 08 == C<* override )
recurse and invert result. 0 0x53 RAM+ ! ( 53 == (emit) override )
0 0x55 RAM+ ! ( 55 == (key) override )
We loop until _pdacc is nonzero, which means either WS or 0 0x0a RAM+ ! ( NLPTR )
non-digit. 1 means WS, which means parsing was a success. ( 0c == C<* )
-1 means non-digit, which means we have a non-decimal. ) ['] (boot<) 0x0c RAM+ !
( boot< always has a char waiting. 06 == C<?* )
1 0x06 RAM+ ! INTERPRET
RDLN$ LIT< _sys [entry]
LIT< CollapseOS (print) NL (main) ;

31
blk/397
View File

@ -1,16 +1,15 @@
: (parsed) ( a -- n f ) ( Now we have "as late as possible" stuff )
DUP C@ ( a c ) : DO COMPILE 2>R H@ ; IMMEDIATE
DUP '-' = IF : LOOP COMPILE (loop) H@ - , ; IMMEDIATE
DROP 1+ ( a+1 ) (parsed) 0 ROT ( f 0 n ) ( LEAVE is implemented in low xcomp )
- SWAP EXIT ( 0-n f ) : LITN 32 , , ( 32 == NUMBER ) ;
THEN ( gets its name at the very end. can't comment afterwards )
0 SWAP _pdacc ( a r f ) : _ BEGIN LIT< ) WORD S= UNTIL ; IMMEDIATE
DUP IF 2DROP 0 EXIT THEN : _ ( : will get its name almost at the very end )
BEGIN ( a r 0 ) (entry)
DROP SWAP 1+ ( r a+1 ) [ 14 ( == compiledWord ) LITN ] C,
DUP C@ ( r a c ) BEGIN
ROT SWAP ( a r c ) WORD FIND
_pdacc ( a r f ) IF ( is word ) DUP IMMED? IF EXECUTE ELSE , THEN
DUP UNTIL ELSE ( maybe number ) (parse) LITN THEN
1 = ( a r f ) AGAIN ;
ROT DROP ( r f ) ;

23
blk/398
View File

@ -1,11 +1,14 @@
( strings being sent to parse routines are always null : IF ( -- a | a: br cell addr )
terminated ) COMPILE (?br) H@ 2 ALLOT ( br cell allot )
; IMMEDIATE
: (parsec) ( a -- n f ) : THEN ( a -- | a: br cell addr )
( apostrophe is ASCII 39 ) DUP H@ -^ SWAP ( a-H a ) !
DUP C@ 39 = OVER 2+ C@ 39 = AND ( a f ) ; IMMEDIATE
NOT IF 0 EXIT THEN ( a 0 ) : ELSE ( a1 -- a2 | a1: IF cell a2: ELSE cell )
( surrounded by apos, good, return ) COMPILE (br)
1+ C@ 1 ( n 1 ) 2 ALLOT
; DUP H@ -^ SWAP ( a-H a )
!
H@ 2- ( push a. -2 for allot offset )
; IMMEDIATE

17
blk/399
View File

@ -1,8 +1,9 @@
( returns negative value on error ) : BEGIN H@ ; IMMEDIATE
: _ ( c -- n ) : AGAIN COMPILE (br) H@ - , ; IMMEDIATE
DUP '0' '9' =><= IF '0' - EXIT THEN : UNTIL COMPILE (?br) H@ - , ; IMMEDIATE
DUP 'a' 'f' =><= IF 0x57 ( 'a' - 10 ) - EXIT THEN : [ INTERPRET ; IMMEDIATE
DROP -1 ( bad ) : ] R> DROP ;
; : LIT< WORD 34 , SCPY 0 C, ; IMMEDIATE
: LITA 36 , , ;
: COMPILE ' LITA ['] , , ; IMMEDIATE
: [COMPILE] ' , ; IMMEDIATE

26
blk/400
View File

@ -1,15 +1,11 @@
: (parseh) ( a -- n f ) ( ';' can't have its name right away because, when created, it
( '0': ASCII 0x30 'x': 0x78 0x7830: 30768 ) is not an IMMEDIATE yet and will not be treated properly by
DUP @ 30768 = NOT IF 0 EXIT THEN ( a 0 ) xcomp. )
( We have "0x" prefix ) : _
2+ ['] EXIT ,
0 ( a r ) R> DROP ( exit : )
BEGIN ; IMMEDIATE
SWAP C@+ ( r a+1 c ) : ['] ' LITA ; IMMEDIATE
DUP NOT IF 2DROP 1 EXIT THEN ( r, 1 ) ';' X' _ 4 - C! ( give ; its name )
_ ( r a n ) ':' X' _ 4 - C! ( give : its name )
DUP 0< IF ROT 2DROP 0 EXIT THEN ( a 0 ) '(' X' _ 4 - C!
ROT 16 * + ( a r*16+n )
AGAIN
;

11
blk/408
View File

@ -1,11 +0,0 @@
: [entry]
HERE @ ( w h )
SWAP SCPY ( h )
HERE @ SWAP - ( sz )
( write prev value )
HERE @ CURRENT @ - ,
C, ( write size )
HERE @ CURRENT !
;
: (entry) WORD [entry] ;

11
blk/430
View File

@ -1,11 +0,0 @@
( Initializes the readln subsystem )
: RDLN$
H@ 0x32 ( IN(* ) RAM+ !
( plus 2 for extra bytes after buffer: 1 for
the last typed 0x0a and one for the following NULL. )
IN) IN( - ALLOT
(infl)
['] RDLN< 0x0c RAM+ !
1 0x06 RAM+ ! ( 06 == C<? )
;

13
blk/431
View File

@ -1,13 +0,0 @@
: .2 DUP 10 < IF SPC THEN . ;
: EOL? ( c -- f ) DUP 0xd = SWAP NOT OR ;
: LIST
BLK@
16 0 DO
I 1+ .2 SPC
64 I * BLK( + DUP 64 + SWAP DO
I C@ DUP EOL? IF DROP LEAVE ELSE EMIT THEN
LOOP
NL
LOOP
;

15
blk/432
View File

@ -1,15 +0,0 @@
: INTERPRET
BEGIN
WORD DUP C@ EOT? IF DROP EXIT THEN
FIND NOT IF (parse) ELSE EXECUTE THEN
C<? NOT IF SPC LIT< ok (print) NL THEN
AGAIN ;
( Read from BOOT C< PTR and inc it. )
: (boot<)
( 2e == BOOT C< PTR )
0x2e ( BOOT C< PTR ) RAM+ @ DUP C@ ( a c )
SWAP 1 + 0x2e RAM+ ! ( c ) ;
( pre-comment for tight LOAD: The 0x08==I check after INTERPRET
is to check whether we're restoring to "_", the word above.
if yes, then we're in a nested load. Also, the 1 in 0x06 is
to avoid tons of "ok" displays. )

16
blk/433
View File

@ -1,16 +0,0 @@
: LOAD
BLK> @ >R ( save restorable variables to RSP )
0x08 RAM+ @ >R ( 08 == C<* override )
0x06 RAM+ @ >R ( C<? )
0x2e RAM+ @ >R ( boot ptr )
BLK@
BLK( 0x2e RAM+ ! ( Point to beginning of BLK )
['] (boot<) 0x08 RAM+ !
1 0x06 RAM+ ! ( 06 == C<? )
INTERPRET
R> 0x2e RAM+ ! R> 0x06 RAM+ !
I 0x08 RAM+ @ = IF ( nested load )
R> DROP ( C<* ) R> BLK@
ELSE ( not nested )
R> 0x08 RAM+ ! R> DROP ( BLK> )
THEN ;

View File

@ -1,4 +0,0 @@
: LOAD+ BLK> @ + LOAD ;
( b1 b2 -- )
: LOADR 1+ SWAP DO I DUP . NL LOAD LOOP ;
: LOADR+ BLK> @ + SWAP BLK> @ + SWAP LOADR ;

14
blk/436
View File

@ -1,14 +0,0 @@
: (main) INTERPRET BYE ;
: BOOT
0x02 RAM+ CURRENT* !
CURRENT @ 0x2e RAM+ ! ( 2e == BOOT C< PTR )
0 0x08 RAM+ ! ( 08 == C<* override )
0 0x53 RAM+ ! ( 53 == (emit) override )
0 0x55 RAM+ ! ( 55 == (key) override )
0 0x0a RAM+ ! ( NLPTR )
( 0c == C<* )
['] (boot<) 0x0c RAM+ !
( boot< always has a char waiting. 06 == C<?* )
1 0x06 RAM+ ! INTERPRET
RDLN$ LIT< _sys [entry]
LIT< CollapseOS (print) NL (main) ;

15
blk/437
View File

@ -1,15 +0,0 @@
( Now we have "as late as possible" stuff )
: DO COMPILE 2>R H@ ; IMMEDIATE
: LOOP COMPILE (loop) H@ - , ; IMMEDIATE
( LEAVE is implemented in low xcomp )
: LITN 32 , , ( 32 == NUMBER ) ;
( gets its name at the very end. can't comment afterwards )
: _ BEGIN LIT< ) WORD S= UNTIL ; IMMEDIATE
: _ ( : will get its name almost at the very end )
(entry)
[ 14 ( == compiledWord ) LITN ] C,
BEGIN
WORD FIND
IF ( is word ) DUP IMMED? IF EXECUTE ELSE , THEN
ELSE ( maybe number ) (parse) LITN THEN
AGAIN ;

14
blk/438
View File

@ -1,14 +0,0 @@
: IF ( -- a | a: br cell addr )
COMPILE (?br) H@ 2 ALLOT ( br cell allot )
; IMMEDIATE
: THEN ( a -- | a: br cell addr )
DUP H@ -^ SWAP ( a-H a ) !
; IMMEDIATE
: ELSE ( a1 -- a2 | a1: IF cell a2: ELSE cell )
COMPILE (br)
2 ALLOT
DUP H@ -^ SWAP ( a-H a )
!
H@ 2- ( push a. -2 for allot offset )
; IMMEDIATE

View File

@ -1,9 +0,0 @@
: BEGIN H@ ; IMMEDIATE
: AGAIN COMPILE (br) H@ - , ; IMMEDIATE
: UNTIL COMPILE (?br) H@ - , ; IMMEDIATE
: [ INTERPRET ; IMMEDIATE
: ] R> DROP ;
: LIT< WORD 34 , SCPY 0 C, ; IMMEDIATE
: LITA 36 , , ;
: COMPILE ' LITA ['] , , ; IMMEDIATE
: [COMPILE] ' , ; IMMEDIATE

11
blk/440
View File

@ -1,11 +0,0 @@
( ';' can't have its name right away because, when created, it
is not an IMMEDIATE yet and will not be treated properly by
xcomp. )
: _
['] EXIT ,
R> DROP ( exit : )
; IMMEDIATE
: ['] ' LITA ; IMMEDIATE
';' X' _ 4 - C! ( give ; its name )
':' X' _ 4 - C! ( give : its name )
'(' X' _ 4 - C!

View File

@ -6,9 +6,9 @@
RAMSTART 0x70 + CONSTANT ACIA_MEM RAMSTART 0x70 + CONSTANT ACIA_MEM
212 LOAD ( z80 assembler ) 212 LOAD ( z80 assembler )
262 LOAD ( xcomp ) 270 LOAD ( xcomp overrides ) 262 LOAD ( xcomp ) 270 LOAD ( xcomp overrides )
282 LOAD ( boot.z80 ) 393 LOAD ( xcomp core low ) 282 LOAD ( boot.z80 ) 353 LOAD ( xcomp core low )
582 LOAD ( acia ) 582 LOAD ( acia )
420 LOAD ( xcomp core high ) 380 LOAD ( xcomp core high )
(entry) _ (entry) _
( Update LATEST ) ( Update LATEST )
PC ORG @ 8 + ! PC ORG @ 8 + !

Binary file not shown.

View File

@ -6,7 +6,7 @@
270 LOAD ( xcomp overrides ) 270 LOAD ( xcomp overrides )
282 LOAD ( boot.z80 ) 282 LOAD ( boot.z80 )
393 LOAD ( xcomp core low ) 353 LOAD ( xcomp core low )
: (emit) 0 PC! ; : (emit) 0 PC! ;
: (key) 0 PC@ ; : (key) 0 PC@ ;
: EFS@ : EFS@
@ -23,7 +23,7 @@
LOOP LOOP
; ;
420 LOAD ( xcomp core high ) 380 LOAD ( xcomp core high )
(entry) _ (entry) _
( Update LATEST ) ( Update LATEST )
PC ORG @ 8 + ! PC ORG @ 8 + !

View File

@ -23,11 +23,11 @@ RETN, 0x98 ZFILL, ( 0x100 )
CURRENT @ XCURRENT ! CURRENT @ XCURRENT !
0x100 BIN( ! 0x100 BIN( !
282 LOAD ( boot.z80 ) 282 LOAD ( boot.z80 )
393 LOAD ( xcomp core low ) 353 LOAD ( xcomp core low )
CREATE ~FNT CPFNT7x7 CREATE ~FNT CPFNT7x7
623 628 LOADR ( VDP ) 623 628 LOADR ( VDP )
632 637 LOADR ( PAD ) 632 637 LOADR ( PAD )
420 LOAD ( xcomp core high ) 380 LOAD ( xcomp core high )
(entry) _ (entry) _
( Update LATEST ) ( Update LATEST )
PC ORG @ 8 + ! PC ORG @ 8 + !

View File

@ -60,11 +60,11 @@ CURRENT @ XCURRENT !
0x100 BIN( ! 0x100 BIN( !
282 LOAD ( boot.z80 ) 282 LOAD ( boot.z80 )
393 LOAD ( xcomp core low ) 353 LOAD ( xcomp core low )
CREATE ~FNT CPFNT3x5 CREATE ~FNT CPFNT3x5
555 560 LOADR ( LCD low ) 555 560 LOADR ( LCD low )
566 570 LOADR ( KBD low ) 566 570 LOADR ( KBD low )
420 LOAD ( xcomp core high ) 380 LOAD ( xcomp core high )
(entry) _ (entry) _
( Update LATEST ) ( Update LATEST )
PC ORG @ 8 + ! PC ORG @ 8 + !

View File

@ -7,9 +7,9 @@ RS_ADDR 0x80 - CONSTANT RAMSTART
0x3000 BIN( ! 0x3000 BIN( !
282 LOAD ( boot.z80 ) 282 LOAD ( boot.z80 )
393 LOAD ( xcomp core low ) 353 LOAD ( xcomp core low )
492 LOAD ( trs80 ) 492 LOAD ( trs80 )
420 LOAD ( xcomp core high ) 380 LOAD ( xcomp core high )
(entry) _ (entry) _
( Update LATEST ) ( Update LATEST )
PC ORG @ 8 + ! PC ORG @ 8 + !