First time here? We are a friendly community of Power Systems Engineers. Check out the FAQ!
1 | initial version |
Hi Guys,
I need some help in coordinated call models in PSSE. I have written a simple user models which takes voltage as input and calcuates the injected current (real and imaginary parts) based on the voltage dip. I set the P and Q fixed.
Some how the injected currents do not match with the hand calculation. Maybe i am missing something or am i doing something wrong ?. Any help would be really appreciated.
It is also very hard to get a working example of a coordinated call model.
Below is the Fortran Code
SUBROUTINE CCMTRY (MC, ISLOT)
INCLUDE 'COMON4.INS'
INTEGER MC,ISLOT,IB, J, K, L
COMPLEX PQ
REAL VM,VFilt
INTRINSIC ABS,CONJG,AIMAG
J = STRTIN(1,ISLOT)
K = STRTIN(2,ISLOT)
L = STRTIN(3,ISLOT)
IB=NUMTRM(MC)
IF(IB.LE.0)RETURN
IF (MODE .GE. 4)RETURN
VM = ABS (VOLT(IB))
IF (MODE .EQ. 1)THEN
STATE(K) = VM
ENDIF
IF (MODE .EQ. 2)THEN
DSTATE (K) = (VM-STATE(K))/CON(J)
ENDIF
IF (MODE .EQ. 3)THEN
VFilt = MAX(STATE(K),0.0)
VAR(L) = VFilt
ENDIF
IF (MODE .EQ. 4)THEN
NINTEG = MAX(NINTEG,K)
ENDIF
RETURN
ENTRY TCMTRY(MC,ISLOT)
IB=NUMTRM(MC)
IF(IB.LE.0)RETURN
PQ=(0.5,0.3)
CURNT(IB)=CURNT(IB)+CONJG(PQ/VFilt)
VAR(L+1) = REAL(CONJG(PQ/VFilt))
VAR(L+2) = AIMAG(CONJG(PQ/VFilt))
RETURN
END
Below is the dyr file i used
1 'USRMDL' 1 'CCMTRY' 101 1 0 1 1 3/