1. rand(repeat(num_subjects, num_subjects))

Hopefully the subject above gets each of {1..num_subjects} exactly once blink

At 12:00 AM 6/27/98 -0400, Automatic digest processor wrote:
[<boot_me at GEOCITIES.COM> Re: Reply-To]
>    My understanding is that you are saying I would like to evaluate "a"
>expression by saying:
>    if a =  1 then
>        do this
>    elsif a= 1 and a = 2 then
>        do that
>            exit
>     elsif a = 1 and a = 2 and a = 3 then
>        do the other thingamajig
>            exit
>    else
>        don't do anything at all
>    end if
>If done sequentially according to the way you expect them to come out, it
>should short circuit itself just fine right???

    Hmm... if a = 1 then "do this" is done, else the other conditions can
    never possibly be right! (except the "don't do anything at all" part is
    done...)

[<jconsuegra at REDESTB.ES> Re: circuits]
>Why don't stop this useless quest?.

    Alright, I will. Sorry for having inconvenienced everyone.

[<C.R.White at SCM.BRAD.AC.UK> Re: atom() ambiguity]
>        not(not {x})
>
>...could be replaced with:
>
>        {x} != 0
>
>...which is a heck of a lot less typing and probably faster too :)

    Right... *if* you intend to truth-check a single-element sequence!

    That's very unlikely the case, probably you would leave out the braces
    around {x}? --> x != 0

[<C.R.White at SCM.BRAD.AC.UK> Re: Short Circuiting + Return in procedures]
>for index = start to finish by step do
>    if data[index] = what_you_want then -- note '=' rather than '!='
>        exit
>    end if
>end for

    That does nothing, because 'index' becomes undefined as soon as the
    program exits the for loop!

>PS Yes, I've used QBasic. IK that EXIT FUNCTION is used, but the syntax
>for returning a value is horrible.

    What about allowing both, Rob?

    It could be handy to allow qbasic's "exit ..." syntax, since it
    gives you a choice between which loop to exit. Example:

    SUB DoSomething ()
        FOR I = 1 TO 5
            J = 1
            DO WHILE J <= I
                PRINT J;
                J = J + 1
                IF J + I = 7 THEN
                    EXIT SUB        ' go to [A]
                    EXIT FOR        ' go to [B]
                    EXIT DO         ' go to [C]
                END IF
            LOOP
            '[C]
            PRINT
        NEXT
        '[B]
    END SUB
    '[A]

    Only the innermost loop of each type can be reached, but at least it
    gives us choice.

    By the way, how about allowing "continue;" as well? (While "break;"
    is translated to "exit", "continue;" has no Euphoria equivalent.)
    Perl's syntax has "next" and "last" and labels, but that would
    roughly be the equivalent of allowing goto.

[<ATU5713 at COMPUSERVE.COM> Re: About a technical list issue]
>Microsoft Outlook Express 4.72.2106.4
>Mozilla 3.04Gold (Win95; U)
>Microsoft Outlook Express 4.71.1712.3

    MS Outlook Express is MS's.
    Mozilla means Netscape.

[<davitf at USA.NET> Various subjects]
>[Get some chars]
>I hope it will be helpful for someone. If it isn't, just ignore it.

    Thanks. It would be for me. smile

>[Euphoria X Perl]

    Yes Perl supports sequences, but in a more obscure way.

[<daber at PAIR.COM> Re: Various subjects]
>I don't know Perl, but languages like Lisp and Scheme use "lists" that are
>just like our sequences. If my memory dosn't fails Rob said once that one of
>Euphoria "inspirations" was Lisp, or alike functional language.

    Right. I like Euphoria's way to manipulate sequences. They are VERY
    easy compared to LISP's, which I believe are composed of three
    functions that can only return
        length(x)
        x[1]
        x[2..length(x)]
    and you must use recursion to find e.g. x[3]. Right? (I haven't really
    used LISP = Lots of Irritating Silly Parentheses.)

[<rds at EMAIL.MSN.COM> Removal from Euphoria List]
>    SET EUPHORIA NODIGESTS

    Shouldn't that be:

    SET EUPHORIA MAIL

    ?

new topic     » topic index » view message » categorize

2. Re: rand(repeat(num_subjects, num_subjects))

>>PS Yes, I've used QBasic. IK that EXIT FUNCTION is used, but the syntax
>>for returning a value is horrible.
>
>    What about allowing both, Rob?
>
>    It could be handy to allow qbasic's "exit ..." syntax, since it
>    gives you a choice between which loop to exit. Example:
>
>    SUB DoSomething ()
>        FOR I = 1 TO 5
>            J = 1
>            DO WHILE J <= I
>                PRINT J;
>                J = J + 1
>                IF J + I = 7 THEN
>                    EXIT SUB        ' go to [A]
>                    EXIT FOR        ' go to [B]
>                    EXIT DO         ' go to [C]
>                END IF
>            LOOP
>            '[C]
>            PRINT
>        NEXT
>        '[B]
>    END SUB
>    '[A]
>
>    Only the innermost loop of each type can be reached, but at least it
>    gives us choice.

Ah.. why not implemt goto's (this is meant ironically)
Withing a set of fixed order statements (i mean routines, they're order of
execution has been set) you may only drop one loop at a time.
Or completely out the ordered set.
You shouldn't be able to drop the program flow anywhere else.
(Neither in the middle of an if- IMHO), but I must admit it is more
princeple than practical.
Although, as Robert asked, I will drop the thread, do hold on the
reply-button blink

>    By the way, how about allowing "continue;" as well? (While "break;"
>    is translated to "exit", "continue;" has no Euphoria equivalent.)
>    Perl's syntax has "next" and "last" and labels, but that would
>    roughly be the equivalent of allowing goto.

Yes, Continue is welcome.
It is in many cases a very clean approach as long as we stay within the same
inner loop.
Funny though in C, it is there because of C is all macro's:
A "for (a, b, c) d " translates in:
{ a & b & c & d & continue } as I recall (maybe the order is a bit
different)

So a for (; x[10] != 'a';) would actually be a while-loop (try it, it works)
You should be able to use continue to restart any { } bracket statement
block in C.

>[<davitf at USA.NET> Various subjects]
>>[Get some chars]
>>I hope it will be helpful for someone. If it isn't, just ignore it.
>
>    Thanks. It would be for me. smile

Nobody made those so far.
In EDOM2 they were there from the beginning.
none_read () I believe

(none as in no-compression)
Using a -1 as len, made it read the whole file and -2 until the '\n'
I've attached device.e and eupdev.e (the new device method I use for EDOM3)
It contains routines for non-streaming I/O.
You could set move from 121 pos 12 bytes to 434
(it also works if it is overlapped, the more the slower though)

The routines are not the fastest but written in such a way it is safe.
I'll use Jacques Deschenes brilliant doswrap to make a file-device that is
very fast.
I will just use this eupdev.e for debugging.
But you people should take a look. It makes I/O much easier.
Esspecially Robert should consider making a distics difference between I/O
of streaming devices and non-streaming devices (as files).

Also a different device means a different set of i/o routines to use in
device.e
The comments in device.e document it enough, the rest will explain itself
blink
>    Right. I like Euphoria's way to manipulate sequences. They are VERY
>    easy compared to LISP's, which I believe are composed of three
>    functions that can only return
>        length(x)
>        x[1]
>        x[2..length(x)]
>    and you must use recursion to find e.g. x[3]. Right? (I haven't really
>    used LISP = Lots of Irritating Silly Parentheses.)

Internally LISP does it completely differently.
Its a linked list in LISP, so x[1] has the pointer to x[2] and x[2] has the
pointer to x[3].
Have fun reading the 324024th element blink
Or requesting its lenght.
However cutting could be much faster with this approach, but not much of
lisp even comes close to Euphoria's speed.

new topic     » goto parent     » topic index » view message » categorize

3. Re: rand(repeat(num_subjects, num_subjects))

>>    My understanding is that you are saying I would like to evaluate "a"
>>expression by saying:
>>    if a =  1 then
>>        do this
>>    elsif a= 1 and a = 2 then
>>        do that
>>            exit
>>     elsif a = 1 and a = 2 and a = 3 then
>>        do the other thingamajig
>>            exit
>>    else
>>        don't do anything at all
>>    end if
>>If done sequentially according to the way you expect them to come out, it
>>should short circuit itself just fine right???
>
>    Hmm... if a = 1 then "do this" is done, else the other conditions can
>    never possibly be right! (except the "don't do anything at all" part is
>    done...)
>
Hmm.. I guess you are right... You would have to reverse it...

if a = 1 and a = 2 and a = 3 then
     do the other thingamajig
     exit
elsif a= 1 and a = 2 then
        do that
            exit
elsif a =  1 then
       do this
            exit
else
        don't do anything at all
end if

Is this better?  I guess the key word to get in my post was "If done right"
:)
Monty

new topic     » goto parent     » topic index » view message » categorize

4. Re: rand(repeat(num_subjects, num_subjects))

-----Original Message-----
De: Andy Kurnia <akur at DELOS.COM>
Para: EUPHORIA at cwisserver1.mcs.muohio.edu
<EUPHORIA at cwisserver1.mcs.muohio.edu>
Fecha: sábado 27 de junio de 1998 11:35
Asunto: rand(repeat(num_subjects, num_subjects))


>[<daber at PAIR.COM> Re: Various subjects]
>>I don't know Perl, but languages like Lisp and Scheme use "lists" that are
>>just like our sequences. If my memory dosn't fails Rob said once that one
of
>>Euphoria "inspirations" was Lisp, or alike functional language.
>
>    Right. I like Euphoria's way to manipulate sequences. They are VERY
>    easy compared to LISP's, which I believe are composed of three
>    functions that can only return
>        length(x)
>        x[1]
>        x[2..length(x)]
>    and you must use recursion to find e.g. x[3]. Right? (I haven't really
>    used LISP = Lots of Irritating Silly Parentheses.)


That's what I like most of Euphoria. With Euphoria sequences and slicing you
can easily create any data structure you want. In Scheme you have only 'car'
and 'cdr' functions that gives you, as Andy pointed, x[1] and
x[2..length(x)] respectivly. You must also use extensive (perhaps the only
way) use of recursion, making very large lists maipulation quite propense to
stack overflows. For me Euphoria is great because you can make it as
<insert-your-prefered-programming-paradigm> as you want.

Regards,
    Daniel   Berstein
    daber at pair.com

new topic     » goto parent     » topic index » view message » categorize

5. Re: rand(repeat(num_subjects, num_subjects))

Oops, forgot to attach it, although no1 seems to notice (what does this tell
me?)
Well, people have a look anyway, its worth it IMHO.

>I've attached device.e and eupdev.e (the new device method I use for EDOM3)
>It contains routines for non-streaming I/O.
>You could set move from 121 pos 12 bytes to 434
>(it also works if it is overlapped, the more the slower though)



begin 666 Device.e
M+2T];STM+3UO/2TM/6\]+2T];STM+3UO/2TM/6\]+2T-"BTM?" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @?"TM#0HM+7P@(" @($5U<&AO<FEA($1E=FEC
M92!-86YA9V5M96YT(&9O<B!%1$]-(" @("!286QF($YI975W96YH=6EJ<V5N
M(" @(" @('PM+0T*+2U\(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @("!\+2T-
M"BTM?" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @?"TM#0HM+7P@(" @(" @
M(" @($9O<B!M;W)E(&EN9F]R;6%T:6]N('1R>2!R=6YN:6YG("=E9&]M:&5L
M<"YE>"<@(" @(" @(" @(" @('PM+0T*+2U\(" @(" @(" @(" @(%EO=2!A
M<F4@=7-I;F<@=&AI<R!F:6QE(&]N('EO=7(@;W=N(')I<VLN(" @(" @(" @
M(" @(" @("!\+2T-"BTM?" @(" @(" @(" @(" @(" @(" @(%1H:7,@9FEL
M92!I<R J9G)E97=A<F4J(" @(" @(" @(" @(" @(" @(" @(" @(" @?"TM
M#0HM+7P@(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @('PM+0T*+2T];STM+3UO
M97)Y(&%S<&5C="!O9B!A(&1E=FEC92!H96%D97(N#0H-"@T*(" @(&-O;G-T
M86YT(%12544@/2 Q+"!&04Q312 ](# -"B @(" -"B @("!G;&]B86P@='EP
M92!D979I8V4@*'-E<75E;F-E(',I#0H@(" @(" @(&EF(&QE;F=T:"AS*2 A
M/2 Q,B!T:&5N#0H@(" @(" @(" @("!R971U<FX@1D%,4T4-"B @(" @(" @
M96QS:68@9FEN9"A44E5%+"!S(#P@+3$I('1H96X-"B @(" @(" @(" @(')E
M='5R;B!&04Q312 @#0H@(" @(" @(&5L<V4-"B @(" @(" @(" @(&9O<B!I
M;F1E>" ](#$@=&\@,3(@9&\-"B @(" @(" @(" @(" @("!I9B!N;W0@:6YT
M96=E<BAS6VEN9&5X72D@=&AE;@T*(" @(" @(" @(" @(" @(" @("!R971U
M<FX@1D%,4T4-"B @(" @(" @(" @(" @("!E;F0@:68-"B @(" @(" @(" @
M(&5N9"!F;W(-"B @(" @(" @(" @(')E='5R;B!44E5%#0H@(" @(" @(&5N
M9"!I9B @(" @( T*(" @(&5N9"!T>7!E#0H@(" @#0H@(" @9VQO8F%L(&-O
M;G-T86YT(" @(" @( T*(" @( T*(" @("TM6T]P96YI;F<@9F]R('-T<F5A
M;2UI;ET-"B @(" @1$5624-%7T]014Y2(" @/2 Q+" @+2T@1G5N8W1I;VXZ
M(%=I;&P@<F5C96EV92!O;F4@87)G=6UE;G0A(%)E='5R;B!I1 T*(" @(" @
M(" @(" @(" @(" @(" @(" @(" M+2!/<B!R971U<FX@86X@97)R;W(@;65S
M<V%G92!A<R!A(#%$+7-E<75E;F-E+@T*(" @(" @(" @(" @(" @(" @(" @
M(" @(" -"B @(" M+5M/<&5N:6YG(&9O<B!S=')E86TM;W5T72 @(" @(" @
M(" @(" @(" @(" @( T*(" @("!$159)0T5?3U!%3E<@(" ](#(L(" M+2!&
M#0H@(" @(" @(" @(" @(" @(" @(" @(" @("TM($]R(')E='5R;B!A;B!E
M<G)O<B!M97-S86=E(&%S(&$@,40M<V5Q=65N8V4N#0H@(" @(" @(" @(" @
M(" @(" @(" @(" @#0H@(" @+2U;3W!E;FEN9R!F;W( at =7!D871E72 A3D].
M+5-44D5!34E.1R$-"B @(" @1$5624-%7T]014Y5(" @/2 S+" @+2T@1G5N
M8W1I;VXZ(%=I;&P@<F5C96EV92!O;F4@87)G=6UE;G0A(%)E='5R;B!I1 T*
M(" @(" @(" @(" @(" @(" @(" @(" @(" M+2!/<B!R971U<FX@86X@97)R
M;W(@;65S<V%G92!A<R!A(#%$+7-E<75E;F-E+@T*(" @(" @(" @(" @(" @
M(" @(" @(" @#0H@(" @+2U;5'EP92!O9B!D871A('1R86YS9F5R70T*(" @
M("!$159)0T5?5%E012 @(" ](#0L(" M+2!3970@=&AI<R!T;R!O;F4@;V8@
M=&AE<V4Z#0H@(" @(" @("!$159)0T5?5%E015]315%514Y#12 ](#$L(" M
M+2!);G!U=" F($]U='!U="!T:')O=6=H(#%$+7-E<75E;F-E<PT*(" @(" @
M(" @1$5624-%7U194$5?345-3U)9(" @/2 R+" @+2T@26YP=70@)B!/=71P
M=70@=&AR;W5G:"!M96UO<GD@8FQO8VMS#0H@(" @(" @(" -"B @(" M+5M#
M;&]S:6YG(&%N(&]P96YE9"!D979I8V5=#0H@(" @($1%5DE#15]#3$]312 @
M(#T@-2P@("TM(%!R;V-E9'5R93H@>R!I1"!]#0H@(" @( T*(" @("TM6U-T
M<F5A;6EN9R!D871A(&]U=%T-"B @(" @1$5624-%7T]55" @(" @/2 V+" @
M+2T at 4')O8V5D=7)E.B![(&E$+"!D871A7V]N;'D@?0T*(" @(" -"B @(" M
M+5M3=')E86UI;F<@9&%T82!I;ET-"B @(" @1$5624-%7TE.(" @(" @/2 W
M+" @+2T@1G5N8W1I;VXZ("![(&E$+"!L96X@?2 A(2 M,2 ]('5N=&EL(&5O
M9B A(2 @( T*(" @(" @(" @(" @(" @(" @(" @(" @(" M+2!2971U<FX@
M<V5Q=65N8V4@*&YE=F5R(&%N(&UE;6]R>2!A9&1R97,A*0T*(" @(" @(" @
M(" @(" @(" @(" @(" @(" M+2!&:6QL('=I=&@@)RTQ)R!W:&5N($5/1B!A
M;F0@;&5N("$]("TQ#0H@(" @(" @(" @(" @(" @(" @(" @(" @#0H@(" @
M(0T*(" @("!$159)0T5?4D5!1" @(" ](#@L(" M+2!&=6YC=&EO;CH@('L@
M:40L('-T87)T+"!L96X@?2 -"B @(" @(" @(" @(" @(" @(" @(" @(" @
M+2T@3&5N(&]F("TQ+"!M96%N<R!T:6QL(&5N9 T*(" @(" @(" @(" @(" @
M(" @(" @(" @(" M+2!3=&%R="!O9B M,2P@;65A;G,@9G)O;2!C=7)R96YT
M('!O<VET:6]N#0H@(" @(" @(" @(" @(" @(" @(" @(" @("TM(%)E='5R
M;B!S97%U96YC92!O<B!M96UO<GD@861D<F5S<PT*(" @(" @(" @(" @(" @
M(" @(" @(" @(" M+2!&:6QL('=I=&@@)RTQ)R!A="!T:&4@14]�H-"B @
M(" M+5M297!L86-E(&%N(&%R96$@;V8@=&AE(&1E=FEC95T@(4Y/3BU35%)%
M04U)3D<A#0H@(" @($1%5DE#15]215!,04-%(#T@.2P@("TM($9U;F-T:6]N
M.B![(&E$+"!S=&%R="P@9&%T85]O<E]M96UA9&1R97,@?0T*(" @(" @(" @
M(" @(" @(" @(" @(" @(" M+2!3=&%R="!O9B M,2!M96%N<R!C=7)R96YT
M('!O<VET:6]N#0H@(" @(" @(" @(" @(" @(" @(" @(" @("TM($%P<&5N
M9"!O<B!C=70@:68@;F5E9&5D#0H@(" @(" @(" @(" @(" @(" @(" @(" @
M("TM(%)E='5R;B!44E5%('=H96X@<W5C8V5S9G5L#0H@(" @#0H@(" @+2U;
M3D<A#0H@(" @($1%5DE#15])3E-%4E0@(#T at ,3 L("TM($9U;F-T:6]N.B![
M(&E$+"!S=&%R="P@9&%T85]O<E]M96UA9&1R97,@?0T*(" @(" @(" @(" @
M(" @(" @(" @(" @(" M+2!3=&%R="!O9B M,2!M96%N<R!C=7)R96YT('!O
M<VET:6]N#0H@(" @(" @(" @(" @(" @(" @(" @(" @("TM($%P<&5N9"!O
M<B!P<F5P96YD(&EF(&YE961E9 T*(" @(" @(" @(" @(" @(" @(" @(" @
M(" M+2!2971U<FX@5%)512!W:&5N('-U8V-E<V9U; T*(" @(" @(" @(" @
M(" @(" @(" @(" @( T*(" @("TM6TUO=F4@86X@87)E82!O9B!T:&4@9&5V
M:6-E72 A3D].+5-44D5!34E.1R$-"B @(" @1$5624-%7TU/5D4@(" @/2 Q
M,2P@+2T@1G5N8W1I;VXZ('L@:40L(&9R;VTL('1O+"!L96X@?2 @( T*(" @
M(" @(" @(" @(" @(" @(" @(" @(" M+2!&<F]M(&]F("TQ(&UE86YS(&-U
M<G)E;G0@<&]S:71I;VX-"B @(" @(" @(" @(" @(" @(" @(" @(" @+2T@
M4F5T=7)N(%12544@=VAE;B!S=6-C97-F=6P-"B @(" @#0H@(" @+2U;1&5L
M(" @($1%5DE#15]$14Q%5$4@(#T at ,3( at ("TM($9U;F-T:6]N.B![(&E$+"!S
M=&%R="P@;&5N('T@(" @( T*(" @(" @(" @(" @(" @(" @(" @(" @(" M
M+2!3=&%R="!O9B M,2!M96%N<R!C=7)R96YT('!O<VET:6]N#0H@(" @(" @
M(" @(" @(" @(" @(" @(" @("TM($1E;&5T92!A<R!M=6-H(&%S('EO=2!C
M86X@8G5T(&1O;B=T($524D]2(0T*(" @(" @(" @(" @(" @(" @(" @(" @
M(" M+2!2971U<FX@5%)512!W:&5N('-U8V-E<V9U; T*(" @(" @(" @(" @
M(" @(" @(" @(" @#0H@(" @+2T@2&5L<&5R(')O=71I;F4@>&Q?9V5T<R H
M:6UP<F]V960@9V5T<RD-"B @("!G;&]B86P@9G5N8W1I;VX@>&Q?9V5T<R H
M9&5V:6-E(&0L(&]B:F5C="!I9"P@;V)J96-T('-T;W I#0H@(" @:6YT96=E
M<B!I;E]P;VEN=&5R#0H@(" @<V5Q=65N8V4@<F5T#0H@(" @(" @( T*(" @
M(" @("!I;E]P;VEN=&5R(#T@9%M$159)0T5?24Y=(" @(" @( T*(" @(" @
M("!I9" ]('MI9'T@(" M+2!A<F=U;65N="!L:7-T('=I=&@@:60@87,@;VYL
M>2!A<F=U;65N="$-"B @(" @(" @#0H@(" @(" @(')E=" ]('MC86QL7V9U
M;F,@*&EN7W!O:6YT97(L(&ED*7T-"B @(" @(" @:68@<V5Q=65N8V4H<W1O
M<"D@=&AE;@T*(" @(" @(" @(" @=VAI;&4@,2!D;PT*(" @(" @(" @(" @
M(" @(&9O<B!I;F1E>" ](#$@=&\@;&5N9W1H*'-T;W I(&1O#0H@(" @(" @
M(" @(" @(" @(" @(&EF(')E=%ML96YG=&@H<F5T*5T@/2!S=&]P6VEN9&5X
M72!T:&5N#0H@(" @(" @(" @(" @(" @(" @(" @("!R971U<FX@<F5T#0H@
M(" @(" @(" @(" @(" @(" @(&5N9"!I9@T*(" @(" @(" @(" @(" @(&5N
M9"!F;W(-"B @(" @(" @(" @(" @("!R970@/2!A<'!E;F0H<F5T+"!C86QL
M7V9U;F,@*&EN7W!O:6YT97(L(&ED*2D-"B @(" @(" @(" @(&5N9"!W:&EL
M90T*(" @(" @("!E;'-E#0H@(" @(" @(" @("!W:&EL92!R971;;&5N9W1H
M*')E="E=("$]('-T;W @9&\-"B @(" @(" @(" @(" @("!R970@/2!A<'!E
M;F0H<F5T+"!C86QL7V9U;F,@*&EN7W!O:6YT97(L(&ED*2D-"B @(" @(" @
M(" @(&5N9"!W:&EL90T*(" @(" @("!E;F0@:68@(" @#0H@(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" -"B @
M(" @(" @<F5T=7)N(')E= T*(" @(&5N9"!F=6YC=&EO;@T*(" @(" @( T*
.(" @( T*(" @( T*#0H`
`
end

begin 666 Eupdev.e
M+2T];STM+3UO/2TM/6\]+2T];STM+3UO/2TM/6\]+2T-"BTM?" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @?"TM#0HM+7P@(" @($5U<&AO<FEA($1E=FEC
M92!);G1E<F9A8V4@9F]R($5$3TT@(" @("!286QF($YI975W96YH=6EJ<V5N
M(" @(" @('PM+0T*+2U\(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @("!\+2T-
M"BTM?" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @?"TM#0HM+7P@(" @(" @
M(" @($9O<B!M;W)E(&EN9F]R;6%T:6]N('1R>2!R=6YN:6YG("=E9&]M:&5L
M<"YE>"<@(" @(" @(" @(" @('PM+0T*+2U\(" @(" @(" @(" @(%EO=2!A
M<F4@=7-I;F<@=&AI<R!F:6QE(&]N('EO=7(@;W=N(')I<VLN(" @(" @(" @
M(" @(" @("!\+2T-"BTM?" @(" @(" @(" @(" @(" @(" @(%1H:7,@9FEL
M92!I<R J9G)E97=A<F4J(" @(" @(" @(" @(" @(" @(" @(" @(" @?"TM
M#0HM+7P@(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @('PM+0T*+2T];STM+3UO
M;&5D("=$159?15502$]224$G#0H-"BTM6U)E<V]U<F-E<UT-"@T*(" @(&EN
M8VQU9&4@9&5V:6-E+F4@(" @+2T@5&AI<R!I<R!A;B H141/33,I($1E=FEC
M92 A#0H@(" @:6YC;'5D92!F:6QE+F4@(" @(" M+2!3=&%N9&%R9"!%=7!H
M;W)I82!);F-L=61E(&9O<B!S965K*"D@)B!W:&5R92@I#0H@(" @:6YC;'5D
M92!D;W,N92 @(" @(" M+2!$:7)E8W0@1$]3($]P97)A=&EO;G,@9F]R(&1E
M;&5T92 H*0T*#0H@(" @8V]N<W1A;G0@5%)512 ](#$L($9!3%-%(#T@, T*
M($5U<&AO<FEA(')O=71I;F5S70T*(" @("TM(%1H:7,@:7,@;6]S=&QY('5S
M=VAE;B -"B @(" M+2!%=7!H;W)I82!G971S('!O<G1E9"!T;R!D:69F97)E
M;G0@;6%C:&EN97,N(%1H97D@*F%R92H@<VQO=RP@8G5T( T*(" @("TM(&-O
M;G-I<W1E;G0@86YD('-A9F4@86QS;RX@(" @#0H@(" @#0H@(" @+2T@5FER
M='5A;"!H86YD;&5S#0H@(" @<V5Q=65N8V4@975P7VAA;F1L97,@975P7VAA
M;F1L97,@/2![?2 @(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @#0H@
M(" @<V5Q=65N8V4@975P7VYA;65S(&5U<%]N86UE<R ]('M]#0H@(" @#0HM
M#0H@(" @9G5N8W1I;VX@975P7VUO=F5?=&\@*&EN=&5G97(@:60L(&EN=&5G
M97(@<W1A<G0I#0H@(" @:6YT96=E<B!R970@(" @(" @(" @(" @(" @(" -
M"B @(" @(" @:68@<W1A<G0@/" P('1H96X@<W1A<G0@/2 P(&5N9"!I9@T*
M(" @(" @("!I9B!W:&5R92AI9"D@(3T@<W1A<G0@=&AE;@T*(" @(" @(" @
M(" @<F5T(#T@<V5E:RAI9"P@<W1A<G0I#0H@(" @(" @(" @("!I9B!R970@
M=&AE;@T*(" @(" @(" @(" @(" @(')E='5R;B!&04Q312 M+2!3=')E86UI
M;F<@;VYL>2!D979I8V4-"B @(" @(" @(" @(&5L<V4-"B @(" @(" @(" @
M(" @("!R971U<FX@5%)510T*(" @(" @(" @(" @96YD(&EF( T*(" @(" @
M("!E;'-E#0H@(" @(" @(" @("!R971U<FX@5%)510T*(" @(" @("!E;F0@
M:68@(" @(" @(" @(" @(" @(" -"B @("!E;F0@9G5N8W1I;VX-"@T*+2U;
M3W!E;B F($-L;W-E(')O=71I;F5S70T*#0H@(" @9G5N8W1I;VX@975P7V]P
M96YR("AS97%U96YC92!F;F%M92D-"B @("!I;G1E9V5R(')E="P@>@T*(" @
M( T*(" @(" @("!R970@/2!O<&5N("AF;F%M92P@(G)B(BD-"B @(" @(" @
M#0H@(" @(" @(&EF(')E=" ]("TQ('1H96X-"B @(" @(" @(" @(')E='5R
M;B B54Y!0DQ%(%1/($]014X@1DE,13H@(B F(&9N86UE#0H@(" @(" @(&5L
M<V4-"B @(" @(" @(" @('H@/2!F:6YD("@M,2P@975P7VAA;F1L97,I#0H@
M(" @(" @(" @("!I9B!Z('1H96X-"B @(" @(" @(" @(" @("!E=7!?:&%N
M9&QE<UMZ72 ](')E=" -"B @(" @(" @(" @(" @("!E=7!?;F%M97,@/2!&
M04Q310T*(" @(" @(" @(" @96QS90T*(" @(" @(" @(" @(" @(&5U<%]H
M86YD;&5S(#T@87!P96YD("AE=7!?:&%N9&QE<RP@<F5T*0T*(" @(" @(" @
M(" @(" @(&5U<%]N86UE<R ](&%P<&5N9" H975P7VYA;65S+"!&04Q312D-
M"B @(" @(" @(" @(" @("!Z(#T@;&5N9W1H*&5U<%]H86YD;&5S*0T*(" @
M(" @(" @(" @96YD(&EF#0H@(" @(" @(" @("!R971U<FX@;&5N9W1H*&5U
M<%]H86YD;&5S*0T*(" @(" @("!E;F0@:68-"B @(" @(" @#0H@(" @96YD
M(&9U;F-T:6]N#0H-"B @("!F=6YC=&EO;B!E=7!?;W!E;G<@*'-E<75E;F-E
M(&9N86UE*0T*(" @(&EN=&5G97(@<F5T+"!Z#0H@(" @#0H@(" @(" @(')E
M=" ](&]P96X@*&9N86UE+" B=V(B*0T*(" @(" @(" -"B @(" @(" @:68@
M<F5T(#T@+3$@=&AE;@T*(" @(" @(" @(" @<F5T=7)N(")53D%"3$4@5$\@
M3U!%3B!&24Q%.B B("8@9FYA;64-"B @(" @(" @96QS90T*(" @(" @(" @
M(" @>B ](&9I;F0@*"TQ+"!E=7!?:&%N9&QE<RD-"B @(" @(" @(" @(&EF
M('H@=&AE;@T*(" @(" @(" @(" @(" @(&5U<%]H86YD;&5S6WI=(#T@<F5T
M#0H@(" @(" @(" @(" @(" @975P7VYA;65S6WI=(#T@1D%,4T4-"B @(" @
M(" @(" @(&5L<V4-"B @(" @(" @(" @(" @("!E=7!?:&%N9&QE<R ](&%P
M<&5N9" H975P7VAA;F1L97,L(')E="D-"B @(" @(" @(" @(" @("!E=7!?
M;F%M97-;>ET@/2!&04Q310T*(" @(" @(" @(" @(" @('H@/2!L96YG=&@H
M975P7VAA;F1L97,I#0H@(" @(" @(" @("!E;F0@:68-"B @(" @(" @(" @
M(')E='5R;B!L96YG=&@H975P7VAA;F1L97,I#0H@(" @(" @(&5N9"!I9B @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" -"B @(" @(" @#0H@(" @
M96YD(&9U;F-T:6]N(" @(" @(" @(" @( T*(" @( T*(" @(&9U;F-T:6]N
M(&5U<%]O<&5N=2 H<V5Q=65N8V4@9FYA;64I#0H@(" @:6YT96=E<B!R970L
M('H-"B @(" -"B @(" @(" @<F5T(#T@;W!E;B H9FYA;64L(")U8B(I#0H@
M(" @(" @( T*(" @(" @("!I9B!R970@/2 M,2!T:&5N#0H@(" @(" @(" @
M("!R971U<FX at (E5.04),12!43R!/4$5.($9)3$4Z("(@)B!F;F%M90T*(" @
M(" @("!E;'-E#0H@(" @(" @(" @("!Z(#T@9FEN9" H+3$L(&5U<%]H86YD
M;&5S*0T*(" @(" @(" @(" @:68@>B!T:&5N#0H@(" @(" @(" @(" @(" @
M975P7VAA;F1L97-;>ET@/2!R970-"B @(" @(" @(" @(" @("!E=7!?;F%M
M97-;>ET@/2!F;F%M90T*(" @(" @(" @(" @96QS90T*(" @(" @(" @(" @
M(" @(&5U<%]H86YD;&5S(#T@87!P96YD("AE=7!?:&%N9&QE<RP@<F5T*0T*
M(" @(" @(" @(" @(" @(&5U<%]N86UE<R ](&%P<&5N9"AE=7!?;F%M97,L
M(&9N86UE*0T*(" @(" @(" @(" @(" @('H@/2!L96YG=&@H975P7VAA;F1L
M97,I#0H@(" @(" @(" @("!E;F0@:68-"B @(" @(" @(" @(')E='5R;B!L
M96YG=&@H975P7VAA;F1L97,I#0H@(" @(" @(&5N9"!I9@T*(" @(" @(" -
M"B @("!E;F0@9G5N8W1I;VX-"B -"B @("!P<F]C961U<F4@975P7V-L;W-E
M("AI;G1E9V5R(&ED*0T*(" @( T*(" @(" @(" M+2!#;&]S:6YG("8@9&5A
M8W1I=F%T:6YG(&AA;F1L97,-"B @(" @(" @8VQO<V4@*&5U<%]H86YD;&5S
M6VED72D-"B @(" @(" @975P7VAA;F1L97-;:61=(#T@+3$-"B @(" @(" @
M#0H@(" @(" @("TM($-L96%N:6YG('5P(&5U<%]H86YD;&5S#0H@(" @(" @
M(&9O<B!I;F1E>" ](&QE;F=T:"AE=7!?:&%N9&QE<RD@=&\@,2!B>2 M,2!D
M;PT*(" @(" @(" @(" @:68@975P7VAA;F1L97-;:6YD97A=("$]("TQ('1H
M96X-"B @(" @(" @(" @(" @("!E=7!?:&%N9&QE<R ](&5U<%]H86YD;&5S
M6VEN9&5X*S$N+FQE;F=T:"AE=7!?:&%N9&QE<RE=#0H@(" @(" @(" @(" @
M(" @97AI=" M+2!)(&-O=6QD(&IU<W0@<F5T=7)N+"!B=70@=&AA="=S("IB
M860J('-T>6QE(0T*(" @(" @(" @(" @96YD(&EF(" @#0H@(" @(" @(&5N
M9"!F;W(@(" @(" -"B @(" @(" @#0H@(" @96YD('!R;V-E9'5R92 -"B @
M(" -"BTM6U-T<F5A;6EN9R!)+T]=#0H-"B @("!P<F]C961U<F4@975P7V]U
M=" H:6YT96=E<B!I9"P@;V)J96-T('@I#0H@(" @(" @(&EF(&%T;VTH>"D@
M=&AE;@T*(" @(" @(" @(" @<'5T<R H975P7VAA;F1L97-;:61=+"!P965K
M("A[>"P@<&5E:S1U("AX*7TI*0T*(" @(" @("!E;'-E#0H@(" @(" @(" @
M("!P=71S("AE=7!?:&%N9&QE<UMI9%TL('@I#0H@(" @(" @(&5N9"!I9@T*
M(" @(&5N9"!P<F]C961U<F4-"B @(" -"B @("!F=6YC=&EO;B!E=7!?:6X@
M*&EN=&5G97(@:60L(&]B:F5C="!L96XI#0H@(" @<V5Q=65N8V4@<F5T(" @
M(" @#0H@(" @(" @(" @(" @(" @(" @(" -"B @(" @(" @:68@<V5Q=65N
M8V4H;&5N*2!T:&5N#0H@(" @(" @("TM($Y902 @(" @(" @( T*(" @(" @
M("!E;F0@:68@(" @(" @(" @#0H@(" @(" @( T*(" @(" @("!I9B!L96X@
M/2 M,2!T:&5N#0H@(" @(" @(" @("!R970@/2!G971S*&5U<%]H86YD;&5S
M6VED72D-"B @(" @(" @(" @(&EF(&EN=&5G97(H<F5T*2!T:&5N#0H@(" @
M(" @(" @(" @(" @<F5T=7)N('M]#0H@(" @(" @(" @("!E;'-E#0H@(" @
M(" @(" @(" @(" @=VAI;&4@<F5T6VQE;F=T:"AR970I72 A/2 M,2!D;PT*
M(" @(" @(" @(" @(" @(" @<F5T(#T@87!P96YD*')E="P@9V5T8RAE=7!?
M:&%N9&QE<UMI9%TI*0T*(" @(" @(" @(" @(" @(&5N9"!W:&EL92 @(" @
M(" @(" @(" @(" @(" -"B @(" @(" @(" @(" @("!R971U<FX@<F5T6S$N
M+FQE;F=T:"AR970I+3%=#0H@(" @(" @(" @("!E;F0@:68-"B @(" @(" @
M96QS90T*(" @(" @(" @(" @<F5T(#T@<F5P96%T("@P+"!L96XI#0H@(" @
M(" @(" @("!F;W(@:6YD97@@/2 Q('1O(&QE;B!D;R @(" @+2T@5&AE<V4@
M87)E(&AE879I;'D@;W!T:6UI>F5D(0T*(" @(" @(" @(" @(" @(')E=%MI
M;F1E>%T@/2!G971C*&5U<%]H86YD;&5S6VED72D-"B @(" @(" @(" @(&5N
M9"!F;W(-"B @(" @(" @(" @(')E='5R;B!R970-"B @(" @(" @96YD(&EF
M#0H@(" @(" @( T*(" @(&5N9"!F=6YC=&EO;B @( T*(" @( T*+2U;3D].
M+5-T<F5A;6EN9R!)+T]=#0H-"B @("!F=6YC=&EO;B!E=7!?<F5A9" H:6YT
M96=E<B!I9"P@:6YT96=E<B!S=&%R="P@:6YT96=E<B!L96XI#0H@(" @:6YT
M96=E<B!P;W,-"B @("!S97%U96YC92!D871A#0H@(" @(" @('!O<R ]('=H
M97)E("AE=7!?:&%N9&QE<UMI9%TI#0H@(" @(" @(&EF('-T87)T("$]("TQ
M("!T:&5N( T*(" @(" @(" @(" @:68@;F]T(&5U<%]M;W9E7W1O("AE=7!?
M:&%N9&QE<UMI9%TL<W1A<G0I('1H96X-"B @(" @(" @(" @(" @("!R971U
M<FX@<F5P96%T("@M,2P@;&5N*0T*(" @(" @(" @(" @96YD(&EF#0H@(" @
M(" @(&5N9"!I9@T*(" @(" @("!D871A(#T@975P7VEN("AE=7!?:&%N9&QE
M<UMI9%TL(&QE;BD-"B @(" @(" @<&]S(#T@975P7VUO=F5?=&\@*&5U<%]H
M86YD;&5S6VED72QP;W,I("TM('!O<R!I<R!A(&1U;6UY(&AE<F4-"B @(" @
M(" @<F5T=7)N(&1A=&$-"B @("!E;F0@9G5N8W1I;VX-"B @(" -"B @("!F
M=6YC=&EO;B!E=7!?<F5P;&%C92 H:6YT96=E<B!I9"P@:6YT96=E<B!S=&%R
M="P@;V)J96-T('@I#0H@(" @:6YT96=E<B!P;W,-"B @(" @(" @<&]S(#T@
M=VAE<F4@*&5U<%]H86YD;&5S6VED72D-"B @(" @(" @:68@<W1A<G0@/2 M
M,2!T:&5N#0H@(" @(" @(" @("!S=&%R=" ]('!O<PT*(" @(" @("!E;F0@
M:68-"B @(" @(" @:68@<W1A<G0@/" P('1H96X@#0H@(" @(" @(" @("!I
M9B!S97%U96YC92AX*2!T:&5N(" @(" @(" @#0H@(" @(" @(" @(" @(" @
M:68@+7-T87)T(#P@;&5N9W1H*'@I('1H96X-"B @(" @(" @(" @(" @(" @
M(" @>" ]('A;+7-T87)T+BYL96YG=&@H>"E=#0H@(" @(" @(" @(" @(" @
M96QS90T*(" @(" @(" @(" @(" @(" @("!R971U<FX@5%)512 M+2!4:&ES
M(&ES(&QE9V%L#0H@(" @(" @(" @(" @(" @96YD(&EF#0H@(" @(" @(" @
M("!E;'-E#0H@(" @(" @(" @(" @(" @<F5T=7)N(%12544@+2T@5&AI<R!I
M<R!L96=A; T*(" @(" @(" @(" @96YD(&EF#0H@(" @(" @(" @("!S=&%R
M=" ](# -"B @(" @(" @96YD(&EF#0H@(" @(" @(&EF(&5U<%]M;W9E7W1O
M("AE=7!?:&%N9&QE<UMI9%TL('-T87)T*2!T:&5N#0H@(" @(" @(" @("!P
M=71S("AE=7!?:&%N9&QE<UMI9%TL('@I#0H@(" @(" @(" @("!R971U<FX@
M975P7VUO=F5?=&\@*&5U<%]H86YD;&5S6VED72P@<&]S*0T*(" @(" @("!E
M;'-E#0H@(" @(" @(" @("!R971U<FX@1D%,4T4@(" @+2T@4W1R96%M:6YG
M(&]N;'D@9&5V:6-E(&EF('-T:6QL(&5R<F]R(0T*(" @(" @("!E;F0@:68-
M"B @("!E;F0@9G5N8W1I;VX-"B @(" -"B @("!F=6YC=&EO;B!E=7!?:6YS
M97)T("AI;G1E9V5R(&ED+"!I;G1E9V5R('-T87)T+"!O8FIE8W0@>"D-"B @
M("!I;G1E9V5R('!O<PT*(" @('-E<75E;F-E('1E;7 -"B @(" @(" @<&]S
M(#T@=VAE<F4@*&5U<%]H86YD;&5S6VED72D-"B @(" @(" @:68@<W1A<G0@
M/2 M,2!T:&5N('-T87)T(#T@<&]S(&5N9"!I9@T*(" @(" @("!T96UP(#T@
M975P7W)E860@*&5U<%]H86YD;&5S6VED72P@<W1A<G0L("TQ*0T*(" @(" @
M("!I9B!E=7!?;6]V95]T;R H975P7VAA;F1L97-;:61=+"!S=&%R="D@=&AE
M;@T*(" @(" @(" @(" @975P7V]U=" H975P7VAA;F1L97-;:61=+"!X*0T*
M(" @(" @(" @(" @975P7V]U=" H975P7VAA;F1L97-;:61=+"!T96UP*0T*
M(" @(" @(" @(" @<F5T=7)N(&5U<%]M;W9E7W1O("AE=7!?:&%N9&QE<UMI
M9%TL('!O<RD-"B @(" @(" @96QS90T*(" @(" @(" @(" @<F5T=7)N($9!
M3%-%(" @(" @(" M+2!.;VXM<W1R96%M:6YG(0T*(" @(" @("!E;F0@:68@
M(" @(" @#0H@(" @96YD(&9U;F-T:6]N(" @(" @(" @(" @(" @(" @#0H@
M(" @#0H@(" @9G5N8W1I;VX@975P7VUO=F4@*&EN=&5G97(@:60L(&EN=&5G
M97(@9G)O;2P@:6YT96=E<B!T;W0L(&EN=&5G97(@;&5N*0T*(" @('-E<75E
M;F-E('-T86-K#0H@(" @:6YT96=E<B!S=&5P+"!P;W,@#0H@(" @(" @('!O
M<R ]('=H97)E("AE=7!?:&%N9&QE<UMI9%TI#0H@(" @(" @(&EF(&9R;VT@
M/2 M,2!T:&5N#0H@(" @(" @(" @("!F<F]M(#T@<&]S#0H@(" @(" @(&5N
M9"!I9@T*(" @(" @("!I9B!T;W0]9G)O;2!T:&5N#0H@(" @(" @(" @("!R
M971U<FX@5%)510T*(" @(" @("!E;F0@:68@(" @(" @#0H@(" @(" @('-T
M97 @/2!F<F]M("T@=&]T#0H@(" @(" @(&EF('1O=" \(&9R;VT@=&AE;B @
M(" @(" @(" @(" @(" @(" @(" @(" @(" @(" @#0H@(" @(" @(" @("!F
M;W(@:6YD97@@/2 P('1O(&QE;B M(#$@8GD@<W1E<"!D;PT*(" @(" @(" @
M(" @(" @('-T86-K(#T@975P7W)E860@*&5U<%]H86YD;&5S6VED72P@9G)O
M;2P@<W1E<"D-"B @(" @(" @(" @(" @("!I9B!N;W0@975P7W)E<&QA8V4@
M*&5U<%]H86YD;&5S6VED72P@=&]T+"!S=&%C:RD@=&AE;@T*(" @(" @(" @
M(" @(" @(" @("!R971U<FX@1D%,4T4-"B @(" @(" @(" @(" @("!E;F0@
M:68-"B @(" @(" @(" @(&5N9"!F;W(-"B @(" @(" @96QS92 @(" @(" @
M(" @(" @(" @(" @#0H@(" @(" @(" @("!F;W(@:6YD97@@/2!L96XM,2!T
M;R P(&)Y('-T97 @9&\-"B @(" @(" @(" @(" @("!S=&%C:R ](&5U<%]R
M96%D("AE=7!?:&%N9&QE<UMI9%TL(&9R;VTL('-T97 I#0H@(" @(" @(" @
M(" @(" @:68@;F]T(&5U<%]R97!L86-E("AE=7!?:&%N9&QE<UMI9%TL('1O
M="P@<W1A8VLI('1H96X-"B @(" @(" @(" @(" @(" @(" @<F5T=7)N($9!
M3%-%#0H@(" @(" @(" @(" @(" @96YD(&EF#0H@(" @(" @(" @("!E;F0@
M9F]R#0H@(" @(" @(&5N9"!I9B @(" @(" @(" @(" @(" @(" @(" @#0H@
M(" @(" @(')E='5R;B!E=7!?;6]V95]T;R H975P7VAA;F1L97-;:61=+"!P
M;W,I#0H@(" @96YD(&9U;F-T:6]N#0H@(" @#0H@(" @9G5N8W1I;VX@975P
M7V1E;&5T92 H:6YT96=E<B!I9"P@:6YT96=E<B!F<F]M+"!I;G1E9V5R(&QE
M;BD-"B @("!I;G1E9V5R('-U8V-E<RP@<&]S#0H@(" @<V5Q=65N8V4@9&%T
M80T*(" @( T*(" @(" @(" M+2!0<F]B;&5M;S$N+B!F:6QE<R!C86X@;F]T
M('-H<FEN:R!I;B!S:7IE(2$@(" @(" @(" @( T*(" @(" @(" M+2!0<F]B
M="$A#0H@(" @(" @(" @(" @(" @#0H@(" @(" @('!O<R ]('=H97)E("AE
M=7!?:&%N9&QE<UMI9%TI#0H@(" @(" @(&EF(&9R;VT@/2 M,2!T:&5N(&9R
M;VT@/2!P;W,@96YD(&EF#0H@(" @(" @(&1A=&$@/2!E=7!?<F5A9" H:60L
M(# L(&9R;VTI("8@975P7W)E860@*&ED+"!F<F]M*VQE;BP@+3$I#0H@(" @
M(" @( T*(" @(" @("!I9B!F:6YD("@M,2P@9&%T82D@=&AE;@T*(" @(" @
M(" @(" @<F5T=7)N($9!3%-%(" @("TM(%5N<W5C8V5S9G5L.B!D979I8V4@
M<W1R96%M:6YG(&]N;'D-"B @(" @(" @96YD(&EF(" @(" @(" @(" @(" @
M(" -"B @(" @(" @#0H@(" @(" @(&-L;W-E("AE=7!?:&%N9&QE<UMI9%TI
M#0H@(" @(" @('-U8V-E<R ](&1E;&5T92 H975P7VYA;65S6VED72D-"@T*
M(" @(" @("!E=7!?:&%N9&QE<UMI9%T@/2!O<&5N("AE=7!?;F%M97-;:61=
M+" B=6(B*0T*(" @(" @("!I9B!S=6-C97,@=&AE;@T*(" @(" @(" @(" @
M<'5T<R H975P7VAA;F1L97-;:61=+"!D871A*0T*(" @(" @("!E;F0@:68-
M"B @(" @(" @#0H@(" @(" @(&EF(&5U<%]M;W9E7W1O("AE=7!?:&%N9&QE
M<UMI9%TL('!O<RD@=&AE;@T*(" @(" @(" @(" @<F5T=7)N('-U8V-E<PT*
M(" @(" @("!E;'-E( T*(" @(" @(" @(" @<F5T=7)N($9!3%-%(" @("TM
M/PT*(" @(" @("!E;F0@:68-"B @(" @(" @#0H@(" @96YD(&9U;F-T:6]N
*#0H@(" @#0H-"@``
`
end

new topic     » goto parent     » topic index » view message » categorize

6. Re: rand(repeat(num_subjects, num_subjects))

On Sat, 27 Jun 1998, Andy Kurnia wrote:

/me steps on the defensive...

> [<C.R.White at SCM.BRAD.AC.UK> Re: atom() ambiguity]
> >        not(not {x})
> >
> >...could be replaced with:
> >
> >        {x} != 0
> >
> >...which is a heck of a lot less typing and probably faster too :)
>
>     Right... *if* you intend to truth-check a single-element sequence!
>
>     That's very unlikely the case, probably you would leave out the braces
>     around {x}? --> x != 0

Have you tried it? If I know Euphoria, this works... Yes the braces could
be left out, but there was a particular context in the previous post that
(IIRC :) ) needed them to avoid type-errors.

> [<C.R.White at SCM.BRAD.AC.UK> Re: Short Circuiting + Return in procedures]
> >for index = start to finish by step do
> >    if data[index] = what_you_want then -- note '=' rather than '!='
> >        exit
> >    end if
> >end for
>
>     That does nothing, because 'index' becomes undefined as soon as the
>     program exits the for loop!

You can either save the index to a declared variable before you 'exit',
or you can do this:

integer index

index = start
while index <= finish do -- emulated 'for'

    if data[index] = what_you_want -- as above
        exit
    end if

index = index + step
end while

--
Carl R White - But then, I could just be insane...
E-mail...: cyrek- at -bigfoot.com              / Remove the hyphens before
Finger...: crwhite- at -dcsun1.comp.brad.ac.uk \ mailing or fingering...
Url......: http://www.bigfoot.com/~cyrek/

new topic     » goto parent     » topic index » view message » categorize

Search



Quick Links

User menu

Not signed in.

Misc Menu