Group Abstract Group Abstract

Message Boards Message Boards

0
|
86 Views
|
2 Replies
|
0 Total Likes
View groups...
Share
Share this post:

Parallel computing a matrix with different variable for each kernel

Posted 2 days ago

Hello, in order to save time I would like to calculate a matrix function, let's say matrix(t), with different values of t for each kernel, the function remaining the same. A single matrix cannot be calculated in parallel. So the idea is to define a queue that is accessed by the kernels. When a kernel has finished the job, it writes the matrix on the disk and accesses the queue to get a t that is not yet being calculated by another kernel and calculates another matrix with this t. This goes on like this until a certain t is reached. I tried the following code with a reduced set of t's for testing:

ParallelEvaluate[
  ClearAll["Global`*"]; 
  SetDirectory["c:/functions"]; Get["matrix.m"];
  SetDirectory["c:/matrices/"];
  ];
tValues = Range[100, 400, 100];
tQueue = CreateDataStructure["Queue", tValues];
Jobs[] := Module[{t, result},
   While[Not[tQueue["EmptyQ"]],
     t = tQueue["Pop"];
     result = matrix[t];
     Export[
      "m_" <> ToString[t] <> "_ID_" <> ToString[$KernelID] <> ".txt", result, "Text"];
     ];
   ];
DistributeDefinitions[tValues, tQueue, Jobs]
parallelJobs = Table[ParallelSubmit[Jobs[]], {15}];
WaitAll[parallelJobs]

I tried different variants, also with ParallelEvaluate, but the result is always the same: the kernels calculate the matrices individually each for t = 100, 200, 300, 400 instead of sharing the calculation with the other kernels. What's wrong with this code?

POSTED BY: Ulrich Utiger
2 Replies

Hello Henrik,

Yes, this works. Meanwhile, I also found out that there is no need to create a queue with CreateDataStructure. It is automatically created by ParallelSubmit (and also by Parallelize). So the following code works:

Job[t_] := Module[{result},
   result = BmatrixK[4, t, 4 10^-8., 40];
   Export[
    "m_" <> ToString[t] <> ".txt", 
    result, "Text"];
   ];
DistributeDefinitions[Job];
parallelJobs = 
  Table[ParallelSubmit[{t}, Job[t]], {t, 1000, 5000, 100}];
WaitAll[parallelJobs];

With Parallelize it gets even simpler. Sometimes, it is easier than one might think...

Thanks

POSTED BY: Ulrich Utiger

Ulrich,

I may be on the wrong track, but I think ParallelEvaluate[] is exactly what you do not want, as it is intended to evaluate the same on each kernel. Would the following simple approach work for you?

mat[t_] := Array[Sin[#1 t] Cos[#2 t] &, {100, 100}];  (* just some matrix function *)
matrices = Parallelize[mat /@ Range[1, 500]];
POSTED BY: Henrik Schachner
Reply to this discussion
Community posts can be styled and formatted using the Markdown syntax.
Reply Preview
Attachments
Remove
or Discard