fix: add columns event
This commit is contained in:
parent
c8d83e8cf3
commit
093fff058d
@ -12,6 +12,7 @@ export const makeImpl = (c) => () => {
|
||||
const parser = new ParserWithColumns(c);
|
||||
parser.once("readable", () => {
|
||||
parser.columns = parser.read();
|
||||
parser.emit('columns', parser.columns)
|
||||
});
|
||||
return parser;
|
||||
};
|
||||
|
@ -3,7 +3,7 @@ module Node.Stream.CSV.Parse where
|
||||
import Prelude hiding (join)
|
||||
|
||||
import Control.Alt ((<|>))
|
||||
import Control.Monad.Error.Class (liftEither)
|
||||
import Control.Monad.Error.Class (liftEither, liftMaybe)
|
||||
import Control.Monad.Except (runExcept)
|
||||
import Control.Monad.Except.Trans (catchError)
|
||||
import Control.Monad.Maybe.Trans (MaybeT(..), runMaybeT)
|
||||
@ -15,7 +15,6 @@ import Data.Bifunctor (lmap)
|
||||
import Data.CSV.Record (class ReadCSVRecord, readCSVRecord)
|
||||
import Data.Either (Either(..))
|
||||
import Data.Filterable (filter)
|
||||
import Data.Foldable (for_)
|
||||
import Data.Map (Map)
|
||||
import Data.Map as Map
|
||||
import Data.Maybe (Maybe(..))
|
||||
@ -117,11 +116,15 @@ foreach
|
||||
-> m Unit
|
||||
foreach stream cb = do
|
||||
UnliftAff unlift <- askUnliftAff
|
||||
|
||||
liftAff $ makeAff \res -> pure mempty <* flip (Event.once columnsH) stream $ const do
|
||||
void $ getOrInitColumnsMap stream
|
||||
res $ Right unit
|
||||
|
||||
liftAff $ makeAff \res -> do
|
||||
removeDataListener <- flip (Event.on dataH) stream \row -> launchAff_ $ delay (wrap 0.0) <* liftEffect do
|
||||
cols <- getOrInitColumnsMap stream
|
||||
for_ cols \cols' -> do
|
||||
record <- liftEither $ lmap (error <<< show) $ runExcept $ readCSVRecord @r @rl cols' row
|
||||
cols <- liftMaybe (error "unreachable") =<< getOrInitColumnsMap stream
|
||||
record <- liftEither $ lmap (error <<< show) $ runExcept $ readCSVRecord @r @rl cols row
|
||||
launchAff_ $ flip catchError (liftEffect <<< res <<< Left) (unlift $ cb record)
|
||||
removeEndListener <- flip (Event.once Stream.endH) stream (res $ Right unit)
|
||||
removeErrorListener <- flip (Event.on Stream.errorH) stream (res <<< Left)
|
||||
@ -165,6 +168,10 @@ readAll stream = do
|
||||
dataH :: forall r a. EventHandle1 (CSVParser r a) (Array String)
|
||||
dataH = EventHandle "data" mkEffectFn1
|
||||
|
||||
-- | `columns` event. Emitted when the header row has been parsed.
|
||||
columnsH :: forall r a. EventHandle1 (CSVParser r a) (Array String)
|
||||
columnsH = EventHandle "columns" mkEffectFn1
|
||||
|
||||
-- | FFI
|
||||
foreign import makeImpl :: forall r. Foreign -> Effect (Stream r)
|
||||
|
||||
|
Loading…
Reference in New Issue
Block a user