Future.st
author Claus Gittinger <cg@exept.de>
Tue, 25 Jun 2019 10:19:33 +0200
changeset 5034 bc09c9790f71
parent 5031 0cfe45b14c1a
child 5037 23ce3b9e9dc2
permissions -rw-r--r--
#REFACTORING by cg class: Future changed: #displayString

"{ Encoding: utf8 }"

"
 This is a Manchester Goodie protected by copyright.
 These conditions are imposed on the whole Goodie, and on any significant
 part of it which is separately transmitted or stored:
	* You must ensure that every copy includes this notice, and that
	  source and author(s) of the material are acknowledged.
	* These conditions must be imposed on anyone who receives a copy.
	* The material shall not be used for commercial gain without the prior
	  written consent of the author(s).
 Further information on the copyright conditions may be obtained by
 sending electronic mail:
	To: goodies-lib@cs.man.ac.uk
	Subject: copyright
 or by writing to The Smalltalk Goodies Library Manager, Dept of
 Computer Science, The University, Manchester M13 9PL, UK

 (C) Copyright 1992 University of Manchester
 For more information about the Manchester Goodies Library (from which
 this file was distributed) send e-mail:
	To: goodies-lib@cs.man.ac.uk
	Subject: help
"
"{ Package: 'stx:libbasic2' }"

"{ NameSpace: Smalltalk }"

ProtoObject subclass:#Future
	instanceVariableNames:'result semaphore'
	classVariableNames:''
	poolDictionaries:''
	category:'Kernel-Processes'
!

!Future class methodsFor:'documentation'!

copyright
"
 This is a Manchester Goodie protected by copyright.
 These conditions are imposed on the whole Goodie, and on any significant
 part of it which is separately transmitted or stored:
	* You must ensure that every copy includes this notice, and that
	  source and author(s) of the material are acknowledged.
	* These conditions must be imposed on anyone who receives a copy.
	* The material shall not be used for commercial gain without the prior
	  written consent of the author(s).
 Further information on the copyright conditions may be obtained by
 sending electronic mail:
	To: goodies-lib@cs.man.ac.uk
	Subject: copyright
 or by writing to The Smalltalk Goodies Library Manager, Dept of
 Computer Science, The University, Manchester M13 9PL, UK

 (C) Copyright 1992 University of Manchester
 For more information about the Manchester Goodies Library (from which
 this file was distributed) send e-mail:
	To: goodies-lib@cs.man.ac.uk
	Subject: help
"
!

documentation
"
    I represent an execution in progress, which will be required some time
    in the future.
    I will immediately start execution in a separate process,
    but delay any messages sent to me, until the execution has completed.
    This is useful for time consuming operations (print jobs, compile jobs etc.),
    which can be done in the background and the user can do something else
    in the meantime. If the computation is finished before the user needs its
    value, he is not forced to wait.
    If the computation is unfinished, he has to wait for the remaining time only.

    [author:]
        tph@cs.man.ac.uk

    [see also:]
        Block Lazy LazyValue
"
!

examples
"
  Starts evaluating the factorial immediately, but waits until
  the result is available before printing the answer
                                                                    [exBegin]
    | fac |

    fac := [50000 factorial] futureValue.
    Transcript showCR: 'evaluating factorial...'.
    Dialog information:'You can do something useful now...'.
    Transcript showCR: fac
                                                                    [exEnd]


  An example illustrating the use of multiple futures and
  explicit resynchronisation.

  Starts evaluating both factorials immediately, but waits until
  both blocks have finished before continuing.
                                                                    [exBegin]
    | fac1 fac2 |

    fac1 := [Transcript showCR: 'Starting fac1.. '. 90000 factorial. Transcript showCR: 'Finished fac1'] futureValue.
    fac2 := [Transcript showCR: 'Starting fac2.. '. 50000 factorial. Transcript showCR: 'Finished fac2'] futureValue.
    fac2 value.
    fac1 value.
    Transcript showCR: 'both completed.'.
                                                                    [exEnd]

  Example showing how arguments may be passed to futures.
                                                                    [exBegin]
    | temp |

    temp := [:x :y | 10 * x * y] futureValue: 3 value: 4.
    Transcript  showCR: temp.

                                                                    [exEnd]

  Claus:
    The above examples do not really show the power of Futures;
    they can be useful, whenever some long-time computation is
    to be done, and some other useful work can be done in the meanwhile.
    for example:

    Without futures, the inputfile is read before opening the view;
    the readTime and view creation times sum up:
                                                                    [exBegin]
        |p text v t1 t2 tAll|

        tAll := TimeDuration toRun:[
            t1 := TimeDuration toRun:[
                p := PipeStream readingFrom:'ls -l /bin /usr/bin /usr/lib /etc'.
                text := p contents.
                p close.
            ].
            t2 := TimeDuration toRun:[
                v := TextView new openAndWait.
            ].    
            v contents:text
        ].
        Transcript showCR:'Time to read: %1' with:t1.
        Transcript showCR:'Time to open: %1' with:t2.
        Transcript showCR:'Time overall: %1' with:tAll.
                                                                    [exEnd]

    The same here:
                                                                    [exBegin]
        |p text v|

        v := TextView new openAndWait.
        p := PipeStream readingFrom:'ls -l /bin /usr/bin /usr/lib /etc'.
        text := p contents.
        p close.
        v contents:text
                                                                    [exEnd]


    With futures, the view creation and reading are done in parallel:
    (if the windowing system is slow when opening the view, the contents may
     be already available - especially on X window systems, where the user
     has to provide the window position with the mouse)
                                                                    [exBegin]
        |p text v t1 t2 tAll|

        tAll := TimeDuration toRun:[
            text := [   
                        |p t|

                        t1 := TimeDuration toRun:[
                            p := PipeStream readingFrom:'ls -l /bin /usr/bin /usr/lib /etc'.
                            t := p contents.
                            p close.
                        ].     
                        t
                    ] futureValue.
            t2 := TimeDuration toRun:[
                v := TextView new openAndWait.
            ].    
            v contents:text
        ].
        Transcript showCR:'Time to read: %1' with:t1.
        Transcript showCR:'Time to open: %1' with:t2.
        Transcript showCR:'Time overall: %1' with:tAll.
                                                                    [exEnd]
"
! !

!Future methodsFor:'evaluating'!

block:aBlock
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:aBlock

    "Modified: / 09-08-2017 / 11:54:19 / cg"
    "Modified: / 12-02-2019 / 20:26:39 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:12 / Claus Gittinger"
!

block:aBlock value:aValue
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:aValue]

    "Modified: / 09-08-2017 / 11:54:23 / cg"
    "Modified: / 12-02-2019 / 20:27:03 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:09 / Claus Gittinger"
!

block:aBlock value:value1 value:value2
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:value1 value:value2]

    "Modified: / 09-08-2017 / 11:54:27 / cg"
    "Modified: / 12-02-2019 / 20:27:20 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:06 / Claus Gittinger"
!

block:aBlock value:value1 value:value2 value:value3
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:value1 value:value2 value:value3]

    "Modified: / 09-08-2017 / 11:54:31 / cg"
    "Modified: / 12-02-2019 / 20:27:31 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:03 / Claus Gittinger"
!

block:aBlock valueWithArguments:anArray
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock valueWithArguments:anArray]

    "Modified: / 09-08-2017 / 11:54:34 / cg"
    "Modified: / 12-02-2019 / 20:27:40 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:49:52 / Claus Gittinger"
!

priority:prio block:aBlock
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value] atPriority:prio

    "Created: / 04-10-2011 / 14:53:21 / cg"
    "Modified: / 09-08-2017 / 11:54:38 / cg"
    "Modified: / 12-02-2019 / 20:27:52 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:20 / Claus Gittinger"
!

priority:prio block: aBlock value: aValue
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:aValue] atPriority:prio

    "Created: / 04-10-2011 / 14:53:35 / cg"
    "Modified: / 09-08-2017 / 11:54:41 / cg"
    "Modified: / 12-02-2019 / 20:28:02 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:23 / Claus Gittinger"
!

priority:prio block:aBlock value:value1 value:value2
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:value1 value:value2] atPriority:prio

    "Created: / 04-10-2011 / 14:54:03 / cg"
    "Modified: / 09-08-2017 / 11:54:44 / cg"
    "Modified: / 12-02-2019 / 20:28:10 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:26 / Claus Gittinger"
!

priority:prio block:aBlock value:value1 value:value2 value:value3
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock value:value1 value:value2 value:value3] atPriority:prio

    "Created: / 04-10-2011 / 14:54:51 / cg"
    "Modified: / 09-08-2017 / 11:54:47 / cg"
    "Modified: / 12-02-2019 / 20:28:21 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:29 / Claus Gittinger"
!

priority:prio block:aBlock valueWithArguments:anArray
    "Execute aBlock in parallel with whoever called me, 
     but ensure that any messages sent to me before execution
     of the block has terminated are suspended until it has terminated."

    self signalSemaphoreAfterForked:[aBlock valueWithArguments:anArray] atPriority:prio

    "Created: / 04-10-2011 / 14:55:14 / cg"
    "Modified: / 09-08-2017 / 11:54:50 / cg"
    "Modified: / 12-02-2019 / 20:28:30 / Stefan Vogel"
    "Modified (comment): / 25-06-2019 / 07:50:32 / Claus Gittinger"
! !

!Future methodsFor:'printing'!

displayOn:aGCOrStream

    "/ what a kludge - Dolphin and Squeak mean: printOn: a stream;
    "/ ST/X (and some old ST80's) mean: draw-yourself on a GC.
    (aGCOrStream isStream) ifFalse:[
        ^ self value displayOn:aGCOrStream
    ].

    semaphore isNil ifTrue:[
        result displayOn:aGCOrStream.
        aGCOrStream nextPutAll:' (Future evaluated)'.
        ^ self.
    ].    
    aGCOrStream nextPutAll:'Future (unevaluated)'
!

displayString
    "defined here, because I inherit from nobody"

    ^ (Object compiledMethodAt:#displayString)
        valueWithReceiver:self
        arguments:nil
        selector:#displayString

    "Modified: / 25-06-2019 / 09:53:38 / Claus Gittinger"
! !

!Future methodsFor:'private'!

signalSemaphoreAfterForked:aBlock
    "common code for all block:* methods.
     Execute aBlock in parallel with whatever called me, 
     and ensure that my private semaphore is signalled at the end."

    semaphore := Semaphore name:'Future'.
    [
        result := aBlock ensure:[semaphore signal. semaphore := nil.]
    ] fork

    "Created: / 25-06-2019 / 07:32:28 / Claus Gittinger"
!

signalSemaphoreAfterForked:aBlock atPriority:prio
    "common code for all block:* methods.
     Execute aBlock in parallel with whatever called me, 
     and ensure that my private semaphore is signalled at the end."

    semaphore := Semaphore name:'Future'.
    [
        result := aBlock ensure:[semaphore signal. semaphore := nil.]
    ] forkAt:prio

    "Created: / 25-06-2019 / 07:33:55 / Claus Gittinger"
! !

!Future methodsFor:'synchronising'!

doesNotUnderstand:aMessage
    "Any message to a Future will end up here."

    |sema|
    
    (sema := semaphore) notNil ifTrue:[
        Processor activeProcess isDebuggerProcess ifTrue:[
            "enable debugging / inspecting"
            ^ aMessage sendTo:self usingClass:Object.
        ].
        sema waitUncounted. "Wait for evaluation to complete"
                            "(if not already completed)"
    ].
    ^ aMessage sendTo:result

    "Modified: / 04-10-2011 / 17:37:18 / cg"
    "Modified: / 01-02-2018 / 10:17:48 / stefan"
    "Modified: / 25-06-2019 / 07:52:42 / Claus Gittinger"
!

perform:aSelector withArguments:argArray
    "send the message aSelector with all args taken from argArray
     to the receiver."

    |sema|

    (sema := semaphore) notNil ifTrue:[
        Processor activeProcess isDebuggerProcess ifTrue:[
            "enable debugging / inspecting"
            ^ super perform:aSelector withArguments:argArray.
        ].
        sema waitUncounted.
    ].
    ^ result perform:aSelector withArguments:argArray.

    "Modified (format): / 01-02-2018 / 10:17:44 / stefan"
    "Modified: / 25-06-2019 / 07:53:01 / Claus Gittinger"
!

value
    "retrieve the value, possibly waiting for the result to arrive"
    
    |sema|

    (sema := semaphore) notNil ifTrue:[
        sema waitUncounted. "Wait for evaluation to complete"
                            "(if not already completed)"
    ].
    ^ result

    "Created: / 04-10-2011 / 17:36:06 / cg"
    "Modified (comment): / 25-06-2019 / 07:53:28 / Claus Gittinger"
! !

!Future methodsFor:'testing'!

hasValue
    ^ semaphore isNil or:[semaphore wouldBlock not].

    "Modified: / 04-10-2011 / 17:29:36 / cg"
!

isLazyValue
    ^ semaphore notNil and:[semaphore wouldBlock]
! !

!Future class methodsFor:'documentation'!

version
    ^ '$Header$'
!

version_CVS
    ^ '$Header$'
! !