module Villefort.Ml where

import System.Process
import Control.Monad
import Control.Concurrent

train :: IO ()
train = do
    callCommand "/home/chris/Haskell/Villefort/ml/Train.py" >> putStrLn "train"
predict :: IO ()
predict = do
   callCommand"/home/chris/Haskell/Villefort/ml/Predict.py" >> putStrLn "predict"
ml :: IO ()
ml = do
 -- predict
  threadDelay 18000000
  
dailyMl :: IO ()
dailyMl = forever ml