I saw the last response after recoding to get something workable. I thought I would show it so that there is a complete solution in the responses.
khat = .162;
xin = .028;
vhat = .017;
WronsFUN[\[Lambda]_?NumberQ, w_?NumberQ, xoo_?NumberQ] := Module[
{val, nIN, nOUT},
nIN = NDSolve[{\[Lambda] == -I*w*x^(3/2) - vhat*x/y[x]*y'[x] -
7/2*khat*x^2/y[x]*y'[x] - khat*x^3/y[x]*y''[x],
vhat*xin^(-1/2)*y[xin] + khat*xin^(3/2)*y'[xin] == y[xin],
y[xin] == 1}, y[x], {x, xin, 1}];
yIN[x_] = First[y[x] /. nIN];
nOUT = NDSolve[{\[Lambda] == -I*w*x^(3/2) - vhat*x/y[x]*y'[x] -
7/2*khat*x^2/y[x]*y'[x] - khat*x^3/y[x]*y''[x],
vhat*y[1] + khat*y'[1] == -y[1], y[1] == 1}, y[x], {x, xin, 1}];
yOUT[x_] = First[y[x] /. nOUT];
val = yIN[xoo]*yOUT'[xoo] - yOUT[xoo]*yIN'[xoo]; val]
With those definitions the following now seems to work as expected. Or at least not complain about working conditions, salary, or the like.
FindRoot[WronsFUN[j, 21.67, .038], {j, .1 - .1*I}]