2016-07-14 14 views
6

Sto cercando di utilizzare purescript-halogen in combinazione con websockets, ma dopo diversi tentativi non riesco a farli funzionare insieme.Alogena Pure Pure e websocket

Ho visto this question on Thermite and websockets e la risposta di Phil riguardo alla funzione Driver. Alogeno ha anche una funzione Driver, ma ho bisogno di eseguire la funzione Driver con l'effetto Aff, mentre purescript-websockets-simple utilizza l'effetto Eff.

Non ho idea di come trasformare i callback sincroni del pacchetto websocket in codice asincrono in esecuzione nella monade Aff. Devo usare un AVar? Ho bisogno di purescript-coroutines-aff? In tal caso, come faccio a collegare queste parti insieme?

Grazie in anticipo per eventuali indicatori nella giusta direzione!

risposta

9

In questo caso si vorrebbe effettivamente utilizzare purescript-aff-coroutines. Che vi porterà un coroutine Producer che è quindi possibile collegare a un Consumer che spinge i messaggi nel driver:

module Main where 

import Prelude 

import Control.Coroutine (Producer, Consumer, consumer, runProcess, ($$)) 
import Control.Coroutine.Aff (produce) 
import Control.Monad.Aff (Aff) 
import Control.Monad.Aff.AVar (AVAR) 
import Control.Monad.Eff (Eff) 
import Control.Monad.Eff.Exception (EXCEPTION) 
import Control.Monad.Eff.Var (($=)) 

import Data.Array as Array 
import Data.Either (Either(..)) 
import Data.Maybe (Maybe(..)) 

import Halogen as H 
import Halogen.HTML.Indexed as HH 
import Halogen.Util (runHalogenAff, awaitBody) 

import WebSocket (WEBSOCKET, Connection(..), Message(..), URL(..), runMessageEvent, runMessage, newWebSocket) 

---------------------------------------------------------------------------- 
-- Halogen component. This just displays a list of messages and has a query 
-- to accept new messages. 
---------------------------------------------------------------------------- 

type State = { messages :: Array String } 

initialState :: State 
initialState = { messages: [] } 

data Query a = AddMessage String a 

ui :: forall g. H.Component State Query g 
ui = H.component { render, eval } 
    where 
    render :: State -> H.ComponentHTML Query 
    render state = 
    HH.ol_ $ map (\msg -> HH.li_ [ HH.text msg ]) state.messages 

    eval :: Query ~> H.ComponentDSL State Query g 
    eval (AddMessage msg next) = do 
    H.modify \st -> { messages: st.messages `Array.snoc` msg } 
    pure next 

---------------------------------------------------------------------------- 
-- Websocket coroutine producer. This uses `purescript-aff-coroutines` to 
-- create a producer of messages from a websocket. 
---------------------------------------------------------------------------- 

wsProducer :: forall eff. Producer String (Aff (avar :: AVAR, err :: EXCEPTION, ws :: WEBSOCKET | eff)) Unit 
wsProducer = produce \emit -> do 
    Connection socket <- newWebSocket (URL "ws://echo.websocket.org") [] 

    -- This part is probably unnecessary in the real world, but it gives us 
    -- some messages to consume when using the echo service 
    socket.onopen $= \event -> do 
    socket.send (Message "hello") 
    socket.send (Message "something") 
    socket.send (Message "goodbye") 

    socket.onmessage $= \event -> do 
    emit $ Left $ runMessage (runMessageEvent event) 

---------------------------------------------------------------------------- 
-- Coroutine consumer. This accepts a Halogen driver function and sends 
-- `AddMessage` queries in when the coroutine consumes an input. 
---------------------------------------------------------------------------- 

wsConsumer 
    :: forall eff 
    . (Query ~> Aff (H.HalogenEffects (ws :: WEBSOCKET | eff))) 
    -> Consumer String (Aff (H.HalogenEffects (ws :: WEBSOCKET | eff))) Unit 
wsConsumer driver = consumer \msg -> do 
    driver $ H.action $ AddMessage msg 
    pure Nothing 

---------------------------------------------------------------------------- 
-- Normal Halogen-style `main`, the only addition is a use of `runProcess` 
-- to connect the producer and consumer and start sending messages to the 
-- Halogen component. 
---------------------------------------------------------------------------- 

main :: forall eff. Eff (H.HalogenEffects (ws :: WEBSOCKET | eff)) Unit 
main = runHalogenAff do 
    body <- awaitBody 
    driver <- H.runUI ui initialState body 
    runProcess (wsProducer $$ wsConsumer driver) 
    pure unit 

Questo dovrebbe dare una pagina che consente di stampare quasi subito:

  1. ciao
  2. qualcosa
  3. addio

Ma che sta facendo sempre Tutto ciò di cui hai bisogno, onesto! Se utilizzi il produttore con una fonte "reale" otterrai qualcosa di più simile a quello che ti serve.